Skip to content

Commit

Permalink
Merge pull request #122 from rsetienne/develop
Browse files Browse the repository at this point in the history
Conditioning on number of colonists  on ML and sim - CS model
  • Loading branch information
rsetienne authored Sep 27, 2020
2 parents 5006fc0 + 90198ba commit 2fb3dd0
Show file tree
Hide file tree
Showing 29 changed files with 540 additions and 456 deletions.
15 changes: 10 additions & 5 deletions DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,8 +1,8 @@
Package: DAISIE
Type: Package
Title: Dynamical Assembly of Islands by Speciation, Immigration and Extinction
Version: 3.0.1
Date: 2020-08-25
Version: 3.1.0
Date: 2020-09-27
Depends: R (>= 3.5.0)
biocViews:
Imports:
Expand Down Expand Up @@ -81,17 +81,22 @@ Authors@R: c(
person(given = "Giovanni",
family = "Laudanno",
email = "[email protected]",
role = c("ctb")),
role = c("ctb"),
comment = c(ORCID = "0000-0002-2952-3345")),
person(given = "Nadiah",
family = "Kristensen",
email = "[email protected]",
role = c("ctb")),
role = c("ctb"),
comment = c(ORCID = "0000-0002-9720-4581")),
person(given = "Raphael",
family = "Scherrer",
email = "[email protected]",
role = c("ctb")))
License: GPL-3
Description: Simulates and computes the (maximum) likelihood of a dynamical model of island biota assembly through speciation, immigration and extinction. See e.g. Valente et al. 2015. Ecology Letters 18: 844-852, <DOI:10.1111/ele.12461>.
Description: Simulates and computes the (maximum) likelihood of a dynamical
model of island biota assembly through speciation, immigration and
extinction. See e.g. Valente et al. 2015. Ecology Letters 18: 844-852,
<DOI:10.1111/ele.12461>.
NeedsCompilation: yes
Encoding: UTF-8
VignetteBuilder: knitr
Expand Down
165 changes: 53 additions & 112 deletions R/DAISIE_SR_loglik_CS.R
Original file line number Diff line number Diff line change
Expand Up @@ -72,50 +72,10 @@ DAISIE_SR_loglik_CS_M1 <- DAISIE_SR_loglik <- function(
reltolint = reltolint,
verbose = FALSE
) {
# brts = branching times (positive, from present to past)
# - max(brts) = age of the island
# - next largest brts = stem age / time of divergence from the mainland
# The interpretation of this depends on stac (see below)
# For stac = 0, there is no other value.
# For stac = 1 and stac = 5, this is the time since divergence from the immigrant's sister on the mainland.
# The immigrant must have immigrated at some point since then.
# For stac = 2 and stac = 3, this is the time since divergence from the mainland.
# The immigrant that established the clade on the island must have immigrated precisely at this point.
# For stac = 3, it must have reimmigrated, but only after the first immigrant had undergone speciation.
# - min(brts) = most recent branching time (only for stac = 2, or stac = 3)
# pars1 = model parameters
# - pars1[1] = lac = (initial) cladogenesis rate
# - pars1[2] = mu = extinction rate
# - pars1[3] = K = maximum number of species possible in the clade
# - pars1[4] = gam = (initial) immigration rate
# - pars1[5] = laa = (initial) anagenesis rate
# pars2 = model settings
# - pars2[1] = lx = length of ODE variable x
# - pars2[2] = ddep = diversity-dependent model,mode of diversity-dependence
# . ddep == 0 : no diversity-dependence
# . ddep == 1 : linear dependence in speciation rate (anagenesis and cladogenesis)
# . ddep == 11 : linear dependence in speciation rate and immigration rate
# . ddep == 3 : linear dependence in extinction rate
# - pars2[3] = cond = conditioning
# . cond == 0 : no conditioning
# . cond == 1 : conditioning on presence on the island (not used in this single loglikelihood)
# - pars2[4] = parameters and likelihood should be printed (1) or not (0)
# stac = status of the clade formed by the immigrant
# . stac == 0 : immigrant is not present and has not formed an extant clade
# . stac == 1 : immigrant is present but has not formed an extant clade
# . stac == 2 : immigrant is not present but has formed an extant clade
# . stac == 3 : immigrant is present and has formed an extant clade
# . stac == 4 : immigrant is present but has not formed an extant clade, and it is known when it immigrated.
# . stac == 5 : immigrant is not present and has not formed an extant clade, but only an endemic species
# missnumspec = number of missing species
if (is.na(pars2[4])) {
pars2[4] <- 0
}
ddep <- pars2[2]
cond <- pars2[3]
if (cond > 0) {
cat("Conditioning has not been implemented and may not make sense. Cond is set to 0.\n")
}
lac <- pars1[1]
mu <- pars1[2]
K <- pars1[3]
Expand Down Expand Up @@ -297,47 +257,69 @@ DAISIE_SR_loglik_CS_M1 <- DAISIE_SR_loglik <- function(
#'
#' @aliases DAISIE_SR_loglik_CS DAISIE_SR_loglik_all
#'
#' @param pars1 Contains the model parameters: \cr \cr \code{pars1[1]}
#' corresponds to lambda^c (cladogenesis rate) \cr \code{pars1[2]} corresponds
#' to mu (extinction rate) \cr \code{pars1[3]} corresponds to K (clade-level
#' carrying capacity) \cr \code{pars1[4]} corresponds to gamma (immigration
#' rate) \cr \code{pars1[5]} corresponds to lambda^a (anagenesis rate) \cr
#' @param pars1 Contains the model parameters: \cr \cr
#' \code{pars1[1]}
#' corresponds to lambda^c (cladogenesis rate) \cr
#' \code{pars1[2]} corresponds
#' to mu (extinction rate) \cr
#' \code{pars1[3]} corresponds to K (clade-level
#' carrying capacity) \cr
#' \code{pars1[4]} corresponds to gamma (immigration
#' rate) \cr
#' \code{pars1[5]} corresponds to lambda^a (anagenesis rate) \cr
#' \code{pars1[6]} corresponds to lambda^c (cladogenesis rate) after the shift
#' \cr \code{pars1[7]} corresponds to mu (extinction rate) after the shift \cr
#' \cr
#' \code{pars1[7]} corresponds to mu (extinction rate) after the shift \cr
#' \code{pars1[8]} corresponds to K (clade-level carrying capacity) after the
#' shift \cr \code{pars1[9]} corresponds to gamma (immigration rate) after the
#' shift \cr \code{pars1[10]} corresponds to lambda^a (anagenesis rate) after
#' the shift \cr \code{pars1[11]} corresponds to the time of shift \cr
#' @param pars2 Contains the model settings \cr \cr \code{pars2[1]} corresponds
#' to lx = length of ODE variable x \cr \code{pars2[2]} corresponds to ddmodel
#' = diversity-dependent model, model of diversity-dependence, which can be one
#' of\cr \cr ddmodel = 0 : no diversity dependence \cr ddmodel = 1 : linear
#' dependence in speciation rate \cr ddmodel = 11: linear dependence in
#' speciation rate and in immigration rate \cr ddmodel = 2 : exponential
#' dependence in speciation rate\cr ddmodel = 21: exponential dependence in
#' speciation rate and in immigration rate\cr \cr \code{pars2[3]} corresponds
#' to cond = setting of conditioning\cr \cr cond = 0 : conditioning on island
#' age \cr cond = 1 : conditioning on island age and non-extinction of the
#' island biota \cr \cr \code{pars2[4]} sets whether parameters and likelihood
#' should be printed (1) or not (0)
#' shift \cr
#' \code{pars1[9]} corresponds to gamma (immigration rate) after the
#' shift \cr
#' \code{pars1[10]} corresponds to lambda^a (anagenesis rate) after
#' the shift \cr
#' \code{pars1[11]} corresponds to the time of shift \cr
#' @param pars2 Contains the model settings \cr \cr
#' \code{pars2[1]} corresponds
#' to lx = length of ODE variable x \cr
#' \code{pars2[2]} corresponds to ddmodel = diversity-dependent model,
#' model of diversity-dependence, which can be one of\cr \cr
#' ddmodel = 0 : no diversity dependence \cr
#' ddmodel = 1 : linear dependence in speciation rate \cr
#' ddmodel = 11: linear dependence in speciation rate and in immigration rate \cr
#' ddmodel = 2 : exponential dependence in speciation rate\cr
#' ddmodel = 21: exponential dependence in speciation rate and in immigration rate\cr \cr
#' \code{pars2[3]} corresponds
#' to cond = setting of conditioning\cr \cr
#' cond = 0 : conditioning on island age \cr
#' cond = 1 : conditioning on island age and non-extinction of the
#' island biota \cr
#' cond > 1 : conditioning on island age and having at least cond colonizations on the island \cr \cr
#' \code{pars2[4]} sets whether parameters and likelihood should be printed (1) or not (0)
#' @param datalist Data object containing information on colonisation and
#' branching times. This object can be generated using the DAISIE_dataprep
#' function, which converts a user-specified data table into a data object, but
#' the object can of course also be entered directly. It is an R list object
#' with the following elements.\cr The first element of the list has two or
#' three components: \cr \cr \code{$island_age} - the island age \cr Then,
#' depending on whether a distinction between types is made, we have:\cr
#' with the following elements.\cr
#' The first element of the list has two or three components: \cr \cr
#' \code{$island_age} - the island age \cr
#' Then, depending on whether a distinction between types is made, we have:\cr
#' \code{$not_present} - the number of mainland lineages that are not present
#' on the island \cr The remaining elements of the list each contains
#' on the island \cr
#' The remaining elements of the list each contains
#' information on a single colonist lineage on the island and has 5
#' components:\cr \cr \code{$colonist_name} - the name of the species or clade
#' that colonized the island \cr \code{$branching_times} - island age and stem
#' components:\cr \cr
#' \code{$colonist_name} - the name of the species or clade
#' that colonized the island \cr
#' \code{$branching_times} - island age and stem
#' age of the population/species in the case of Non-endemic, Non-endemic_MaxAge
#' and Endemic anagenetic species. For cladogenetic species these should be
#' island age and branching times of the radiation including the stem age of
#' the radiation.\cr \code{$stac} - the status of the colonist \cr \cr *
#' Non_endemic_MaxAge: 1 \cr * Endemic: 2 \cr * Endemic&Non_Endemic: 3 \cr *
#' Non_endemic: 4 \cr * Endemic_MaxAge: 5 \cr \cr \code{$missing_species} -
#' the radiation.\cr
#' \code{$stac} - the status of the colonist \cr \cr
#' - Non_endemic_MaxAge: 1 \cr * Endemic: 2 \cr
#' - Endemic&Non_Endemic: 3 \cr
#' - Non_endemic: 4 \cr
#' - Endemic_MaxAge: 5 \cr \cr
#' \code{$missing_species} -
#' number of island species that were not sampled for particular clade (only
#' applicable for endemic clades) \cr
#' @param methode Method of the ODE-solver. See package deSolve for details.
Expand Down Expand Up @@ -375,47 +357,6 @@ DAISIE_SR_loglik_CS <- DAISIE_SR_loglik_all <- function(
reltolint = 1E-10,
verbose = FALSE
) {
# datalist = list of all data: branching times, status of clade, and numnber of missing species
# datalist[[,]][1] = list of branching times (positive, from present to past)
# - max(brts) = age of the island
# - next largest brts = stem age / time of divergence from the mainland
# The interpretation of this depends on stac (see below)
# For stac = 0, this needs to be specified only once.
# For stac = 1, this is the time since divergence from the immigrant's sister on the mainland.
# The immigrant must have immigrated at some point since then.
# For stac = 2 and stac = 3, this is the time since divergence from the mainland.
# The immigrant that established the clade on the island must have immigrated precisely at this point.
# For stac = 3, it must have reimmigrated, but only after the first immigrant had undergone speciation.
# - min(brts) = most recent branching time (only for stac = 2, or stac = 3)
# datalist[[,]][2] = list of status of the clades formed by the immigrant
# . stac == 0 : immigrant is not present and has not formed an extant clade
# Instead of a list of zeros, here a number must be given with the number of clades having stac = 0
# . stac == 1 : immigrant is present but has not formed an extant clade
# . stac == 2 : immigrant is not present but has formed an extant clade
# . stac == 3 : immigrant is present and has formed an extant clade
# . stac == 4 : immigrant is present but has not formed an extant clade, and it is known when it immigrated.
# . stac == 5 : immigrant is not present and has not formed an extant clade, but only an endemic species
# datalist[[,]][3] = list with number of missing species in clades for stac = 2 and stac = 3;
# for stac = 0 and stac = 1, this number equals 0.
# pars1 = model parameters
# - pars1[1] = lac = (initial) cladogenesis rate
# - pars1[2] = mu = extinction rate
# - pars1[3] = K = maximum number of species possible in the clade
# - pars1[4] = gam = (initial) immigration rate
# - pars1[5] = laa = (initial) anagenesis rate
# - pars1[6]...pars1[10] = same as pars1[1]...pars1[5], but after the shift
# - pars1[11] = time of shift
# pars2 = model settings
# - pars2[1] = lx = length of ODE variable x
# - pars2[2] = ddep = diversity-dependent model,mode of diversity-dependence
# . ddep == 0 : no diversity-dependence
# . ddep == 1 : linear dependence in speciation rate (anagenesis and cladogenesis)
# . ddep == 11 : linear dependence in speciation rate and immigration rate
# . ddep == 3 : linear dependence in extinction rate
# - pars2[3] = cond = conditioning
# . cond == 0 : no conditioning
# . cond == 1 : conditioning on presence on the island (not used in this single loglikelihood)
# - pars2[4] = parameters and likelihood should be printed (1) or not (0)
pars1 = as.numeric(pars1)
check_shift_loglik = shift_before_certain_brts(datalist, pars1)
if(check_shift_loglik != 0){
Expand All @@ -440,7 +381,7 @@ DAISIE_SR_loglik_CS <- DAISIE_SR_loglik_all <- function(
}
loglik <- not_present * logp0
numimm <- not_present + length(datalist) - 1
logcond <- (cond == 1) * log(1 - exp(numimm * logp0))
logcond <- logcondprob(numcolmin = cond,numimm = numimm,logp0 = logp0)
loglik <- loglik - logcond
if (length(datalist) > 1) {
for (i in 2:length(datalist)) {
Expand Down
Loading

85 comments on commit 2fb3dd0

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:158:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type1 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:161:40: style: Do not place spaces around code in parentheses or square brackets.

not_present_type2 <- DDD::roundn( (M / number_colonisations) *
                                       ^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^~

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^~

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^~

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^~

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^~

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless it's followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:1: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:177:1: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:179:1: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:50: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                 ^

R/DAISIE_create_island.R:82:1: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:1: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:1: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:1: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:7:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:23:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:24:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:25:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:47:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:52:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:68:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:69:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:96:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:103:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:105:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:106:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:109:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:113:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:120:1: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:121:1: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:124:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:134:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:137:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:159:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:168:1: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:171:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:195:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:207:1: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:242:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:257:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:266:1: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:270:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:271:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:272:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:274:1: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:288:1: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:300:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:312:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:313:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:314:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:328:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:329:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:338:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:341:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:343:1: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:355:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:356:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:357:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:371:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:372:1: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:373:1: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:385:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:386:1: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:401:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:402:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:403:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:417:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:419:1: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:1: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:1: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:1: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:440:1: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:441:1: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:442:1: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:445:1: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:447:1: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:448:1: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:451:1: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:460:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:1: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:1: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:1: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:481:1: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:482:1: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:496:1: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:497:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:504:1: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:508:1: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:1: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:1: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:1: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:517:1: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:518:1: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:521:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:525:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:529:1: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:16:1: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:1: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:19:1: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:1: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:22:1: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:26:1: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:27:1: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:31:1: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:32:1: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:33:1: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:36:1: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:82:1: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:84:1: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:96:1: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:106:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:121:1: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:123:1: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:26: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                         ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:187:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:89: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                        ^

R/DAISIE_dataprep.R:190:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:32: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                               ^

R/DAISIE_dataprep.R:202:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:82: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                 ^

R/DAISIE_dataprep.R:203:1: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:1: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:204:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:204:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:205:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:147:13: style: Variable and function name style should be snake_case or symbols.

datatable$Missing_species <- as.numeric(as.character
            ^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

@lintr-bot
Copy link

Choose a reason for hiding this comment

The reason will be displayed to describe this comment to others. Learn more.

data-raw/frog_M1_ML.R:5:1: style: Variable and function name style should be snake_case or symbols.

frog_M1_ML <- DAISIE_ML(
^~~~~~~~~~

data-raw/frog_M1_ML.R:7:24: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                       ^

data-raw/frog_M1_ML.R:7:29: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                            ^

data-raw/frog_M1_ML.R:7:36: style: Commas should always have a space after.

initparsopt = c(0.18,0.03,0.0006,2),
                                   ^

data-raw/frog_M1_ML.R:8:19: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                  ^

data-raw/frog_M1_ML.R:8:21: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                    ^

data-raw/frog_M1_ML.R:8:23: style: Commas should always have a space after.

idparsopt = c(1,2,4,5),
                      ^

R/create_pars.R:21:1: style: functions should have cyclomatic complexity of less than 15, this has 35.

are_area_pars <- function(area_pars) {
^

R/create_pars.R:151:1: style: functions should have cyclomatic complexity of less than 15, this has 33.

are_trait_pars <- function(trait_pars) {
^

R/create_pars.R:174:81: style: Lines should not be more than 80 characters.

#' @param immig_rate2  A numeric with the per capita immigration rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/create_pars.R:177:81: style: Lines should not be more than 80 characters.

#' @param clado_rate2  A numeric with the per capita cladogenesis rate with state2
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/create_pars.R:179:81: style: Lines should not be more than 80 characters.

#' @param M2           A numeric with the number of species with trait state 2 on mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/create_pars.R:200:31: style: Variable and function name style should be snake_case or symbols.

M2) {
                              ^~

R/create_pars.R:213:30: style: Put spaces around all infix operators.

testit::assert(trans_rate2 >=0.0)
                             ^~~

R/create_pars.R:214:21: style: Put spaces around all infix operators.

testit::assert(M2 >=0)
                    ^~~

R/DAISIE_check_format.R:7:1: style: functions should have cyclomatic complexity of less than 15, this has 44.

are_rates <- function(rates) {
^

R/DAISIE_check_format.R:18:5: style: Place a space before left parenthesis, except in a function call.

if(length(rates) > 4) {
    ^

R/DAISIE_check_format.R:43:1: style: functions should have cyclomatic complexity of less than 15, this has 19.

are_max_rates <- function(max_rates) {
^

R/DAISIE_check_format.R:155:7: style: Commented code should be removed.

# if (!"branching_times" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:156:7: style: Commented code should be removed.

# if (!"stac" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_check_format.R:157:7: style: Commented code should be removed.

# if (!"missing_species" %in% names(simulation_outputs)) return(FALSE)
      ^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:8:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:47:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:63:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:76:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_create_island_trait <- function(stt_table,
^~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:80:51: style: There should be a space between right parenthesis and an opening curly brace.

trait_pars){
                                                  ^

R/DAISIE_create_island.R:82:81: style: Lines should not be more than 80 characters.

### if there are no species on the island branching_times = island_age, stac = 0, missing_species = 0
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:83:27: style: Commas should always have a space after.

if (length(island_spec[,1]) == 0) {
                          ^

R/DAISIE_create_island.R:102:81: style: Lines should not be more than 80 characters.

island_spec[, "branching time (BP)"] <- totaltime - as.numeric(island_spec[, "branching time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:103:81: style: Lines should not be more than 80 characters.

island_spec[, "Colonisation time (BP)"] <- totaltime - as.numeric(island_spec[, "Colonisation time (BP)"])
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:105:21: style: Use <-, not =, for assignment.

mainland_ntotal = mainland_n + trait_pars$M2
                    ^

R/DAISIE_create_island.R:108:17: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island <- DAISIE_ONEcolonist(totaltime,
                ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:65: style: Only use double-quotes.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
                                                                ^~~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:116:81: style: Lines should not be more than 80 characters.

colonists_present <- sort(as.numeric(unique(island_spec[, 'Mainland Ancestor'])))
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_create_island.R:127:36: warning: no visible global function definition for ‘DAISIE_ONEcolonist’

island_clades_info[[i]] <- DAISIE_ONEcolonist(
                                   ^~~~~~~~~~~~~~~~~~

R/DAISIE_create_island.R:139:1: style: Trailing blank lines are superfluous.

^

R/DAISIE_data.R:2:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:7:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:23:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:24:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:25:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:47:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal clades in list
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:52:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:68:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:69:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close relatives
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:92:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 8 terrestrial avifaunal Galápagos clades in table
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~

R/DAISIE_data.R:96:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:103:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:104:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:105:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:106:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:109:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:113:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:120:81: style: Lines should not be more than 80 characters.

#' \code{$Branching_times} - Stem age of the population/species in the case of "Non_endemic",
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:121:81: style: Lines should not be more than 80 characters.

#'  "Non_endemic_MaxAge" and "Endemic" species with no extant close relatives on the island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:124:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:134:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in RAW format simulated with the ML parameters of the CR model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:137:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:159:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:168:81: style: Lines should not be more than 80 characters.

#' @title 1000 islands in DAISIE format simulated with the ML parameters of the CR
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:171:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:195:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:207:81: style: Lines should not be more than 80 characters.

#' @description Each simulated dataset is an element of the list, which can be called using
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:242:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_sim_constant_rate}()}, \code{\link{DAISIE_plot_sims}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:257:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the terrestrial
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:266:81: style: Lines should not be more than 80 characters.

#' The following elements of the list each contains information on a single colonist lineage
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~

R/DAISIE_data.R:270:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:271:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:272:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:274:81: style: Lines should not be more than 80 characters.

#' branching times of the island clade including the stem age of the clade. \cr \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:288:81: style: Lines should not be more than 80 characters.

#' R. Equilibrium bird species diversity in Atlantic islands. 2017 Current Biology, 27, 1660-1666.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:298:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the birds of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:300:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne, Garcia-R (2019) Current Biology. Island age 52 Myr and mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:312:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:313:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:314:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:328:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:329:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Garcia-R JC (2019) Deep Macroevolutionary Impact of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:338:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of Noctilionoid bats from the Greater Antilles.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:341:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the noctilionoid
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:343:81: style: Lines should not be more than 80 characters.

#' Valente, Etienne and Dávalos (2017) Nature Ecology and Evolution. Island age 20 Myr and
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:355:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:356:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:357:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:371:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:372:81: style: Lines should not be more than 80 characters.

#' @source Valente L, Etienne RS, Dávalos (2017) Recent extinctions disturb path to
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:373:81: style: Lines should not be more than 80 characters.

#' equilibrium diversity in Caribbean bats. Nature Ecology and Evolution, 1, 26.\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_data.R:385:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the fishes of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:386:81: style: Lines should not be more than 80 characters.

#' Lake Biwa (Japan). Main dataset used in Hauffe et al (2020). This list can be generated
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:401:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:402:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:403:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:417:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:419:81: style: Lines should not be more than 80 characters.

#' elevates equilibrium diversity via increasing colonisation. (2020) Journal of Biogeography \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~

R/DAISIE_data.R:426:81: style: Lines should not be more than 80 characters.

#' @format A dataframe containing information on archipelago name, area, age and distance from the mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:427:81: style: Lines should not be more than 80 characters.

#' @description A dataframe with in subsequent columns the name of the archipelago (Archipelago)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:428:81: style: Lines should not be more than 80 characters.

#' the area of the archipelago (Area), the age (Age) and the distance from the mainland (Distance)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:430:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:440:81: style: Lines should not be more than 80 characters.

#' @format A datalist containing data on the 41 archipelagos studied in Valente et
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_data.R:441:81: style: Lines should not be more than 80 characters.

#' al 2020 (Main Dataset D1). Contains colonisation and branching times for bird species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_data.R:442:81: style: Lines should not be more than 80 characters.

#' in each of the archipelagos. It also contains information on archipelago name, area,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:445:81: style: Lines should not be more than 80 characters.

#' Each archipelago can be called separately using archipelagos41[[x]] with x being a
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:447:81: style: Lines should not be more than 80 characters.

#' top part of the archipelago item where the archipelago name and physical features
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:448:81: style: Lines should not be more than 80 characters.

#' are displayed. The structure of each of the archipelagos is the same as regular DAISIE
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:451:81: style: Lines should not be more than 80 characters.

#'  Tiedemann R, Illera JC, Thébaud C, Aschenbach T, Etienne RS. A simple dynamic model
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:460:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus clades from Hispaniola island.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:464:81: style: Lines should not be more than 80 characters.

#' @description A list containing the colonization and branching times of the Eleutherodactylus frogs of
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:466:81: style: Lines should not be more than 80 characters.

#' using the DAISIE_dataprep function, which converts a user-specified data table into a data object,
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:480:81: style: Lines should not be more than 80 characters.

#' \code{$branching_times} - island age followed by stem age of the population/species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:481:81: style: Lines should not be more than 80 characters.

#' in the case of Non-endemic, Non-endemic_MaxAge species and Endemic species with no close
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_data.R:482:81: style: Lines should not be more than 80 characters.

#' relatives on the island. For endemic clades with more than one species on the island
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:496:81: style: Lines should not be more than 80 characters.

#' @seealso \code{\link{DAISIE_dataprep}}, \code{\link{DAISIE_ML}}, \code{\link{DAISIE_SR_ML}}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~

R/DAISIE_data.R:497:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_data.R:504:81: style: Lines should not be more than 80 characters.

#' @title Colonization and branching times of 5 Eleutherodactylus (frogs) clades from
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~

R/DAISIE_data.R:508:81: style: Lines should not be more than 80 characters.

#' @description A table containing the colonization and branching times of the Eleutherodacytlus
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~

R/DAISIE_data.R:509:81: style: Lines should not be more than 80 characters.

#'frogs of the island of Hispaniola (Greater Antilles). Each row on the table represents and independent
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:515:81: style: Lines should not be more than 80 characters.

#' * Non_endemic: for non-endemic island species when an approximate time of colonisation is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~~

R/DAISIE_data.R:516:81: style: Lines should not be more than 80 characters.

#' * Non_endemic_MaxAge: for non-endemic island species when colonisation time is unknown \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~

R/DAISIE_data.R:517:81: style: Lines should not be more than 80 characters.

#' * Endemic: for endemic species when an approximate colonisation time is known \cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_data.R:518:81: style: Lines should not be more than 80 characters.

#' * "Endemic_MaxAge": applies to endemic species or endemic clades for cases where the
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~

R/DAISIE_data.R:521:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_data.R:525:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_data.R:529:81: style: Lines should not be more than 80 characters.

#' @source Etienne RS, Haegeman B, Dugo-Cota A, Vila C, Gonzalez-Voyer A & Valente L. The
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~

R/DAISIE_dataprep.R:16:81: style: Lines should not be more than 80 characters.

#' "Non_endemic": applies to non-endemic species when an approximate colonisation time is known \cr *
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:18:81: style: Lines should not be more than 80 characters.

#' colonisation time is unknown \cr * "Endemic": applies to endemic species or endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:19:81: style: Lines should not be more than 80 characters.

#' clades when an approximate colonisation time is known \cr * "Endemic_MaxAge": applies to endemic
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:20:81: style: Lines should not be more than 80 characters.

#' species or endemic clades for cases where the colonisation time is unknown, or when
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:22:81: style: Lines should not be more than 80 characters.

#' This could for example apply to endemic species that have recently gone extinct because
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:26:81: style: Lines should not be more than 80 characters.

#' time of the first cladogenetic event is known, but the precise time of colonisation
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:27:81: style: Lines should not be more than 80 characters.

#' is not. \cr * "Endemic&Non_Endemic": when endemic clade is present and its mainland
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:31:81: style: Lines should not be more than 80 characters.

#'  be equal to the number of species in the clade minus 1 \cr \code{$Branching_times}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:32:81: style: Lines should not be more than 80 characters.

#'  - Stem age of the population/species in the case of "Non_endemic", "Non_endemic_MaxAge"
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~~

R/DAISIE_dataprep.R:33:81: style: Lines should not be more than 80 characters.

#'  and "Endemic" species with no extant close relatives on the island. Set "NA" if
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:36:81: style: Lines should not be more than 80 characters.

#' radiation, including the stem age of the radiation (colonisation time estimate).\cr
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~

R/DAISIE_dataprep.R:82:81: style: Lines should not be more than 80 characters.

#' \cr * Endemic_MaxAge: 6 (if colonisation time and cladogenesis times were given)
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:84:81: style: Lines should not be more than 80 characters.

#' for particular clade (only applicable for endemic clades) \cr \code{$type_1or2}
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~

R/DAISIE_dataprep.R:96:81: style: Lines should not be more than 80 characters.

#' ### Create Galapagos data object where all taxa have the same macroevolutionary process
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:106:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:121:81: style: Lines should not be more than 80 characters.

#' # for the Darwin's finches. One process applies to type 1 species (all species
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^

R/DAISIE_dataprep.R:123:81: style: Lines should not be more than 80 characters.

#' # (Darwin's finches). Set fraction of potential colonists of type 2 to be 0.163.
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:136:1: style: functions should have cyclomatic complexity of less than 15, this has 29.

DAISIE_dataprep = function(datatable,
^

R/DAISIE_dataprep.R:136:1: style: Variable and function name style should be snake_case or symbols.

DAISIE_dataprep = function(datatable,
^~~~~~~~~~~~~~~

R/DAISIE_dataprep.R:136:17: style: Use <-, not =, for assignment.

DAISIE_dataprep = function(datatable,
                ^

R/DAISIE_dataprep.R:138:28: style: Variable and function name style should be snake_case or symbols.

M,
                           ^

R/DAISIE_dataprep.R:144:1: style: Opening curly braces should never go on their own line and should always be followed by a new line.

​{
^

R/DAISIE_dataprep.R:174:13: warning: 1:nrow(...) is likely to be wrong in the empty edge case, use seq_len.

for (i in 1:nrow(datatable)) {
            ^

R/DAISIE_dataprep.R:184:7: style: Place a space before left parenthesis, except in a function call.

if(is.na(the_brts[1])){
      ^

R/DAISIE_dataprep.R:184:27: style: There should be a space between right parenthesis and an opening curly brace.

if(is.na(the_brts[1])){
                          ^

R/DAISIE_dataprep.R:185:15: style: Put spaces around all infix operators.

the_brts<-island_age
             ~^~~

R/DAISIE_dataprep.R:186:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:186:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:186:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:186:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:186:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:186:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:187:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:187:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:187:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:188:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:188:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:188:49: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                                                ^

R/DAISIE_dataprep.R:189:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
        ^

R/DAISIE_dataprep.R:189:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                     ^

R/DAISIE_dataprep.R:189:63: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                              ^

R/DAISIE_dataprep.R:189:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~~~

R/DAISIE_dataprep.R:189:90: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Non_endemic" | datatable[i,"Status"] == "Non_Endemic"){
                                                                                         ^

R/DAISIE_dataprep.R:190:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:190:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:190:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Non_endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~~~~~

R/DAISIE_dataprep.R:191:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                    ^

R/DAISIE_dataprep.R:191:31: style: Put spaces around all infix operators.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                              ^~~

R/DAISIE_dataprep.R:191:53: style: Closing curly-braces should always be on their own line, unless they are followed by an else.

datatable[i,"Status"] <-"Non_endemic_MaxAge"}
                                                    ^

R/DAISIE_dataprep.R:194:7: style: Place a space before left parenthesis, except in a function call.

if(max(the_brts)>island_age){
      ^

R/DAISIE_dataprep.R:194:21: style: Put spaces around all infix operators.

if(max(the_brts)>island_age){
                   ~^~

R/DAISIE_dataprep.R:194:33: style: There should be a space between right parenthesis and an opening curly brace.

if(max(the_brts)>island_age){
                                ^

R/DAISIE_dataprep.R:202:9: style: Place a space before left parenthesis, except in a function call.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
        ^

R/DAISIE_dataprep.R:202:22: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                     ^

R/DAISIE_dataprep.R:202:59: style: Commas should always have a space after.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                          ^

R/DAISIE_dataprep.R:202:81: style: Do not place spaces around code in parentheses or square brackets.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                ^

R/DAISIE_dataprep.R:202:81: style: Lines should not be more than 80 characters.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~

R/DAISIE_dataprep.R:202:83: style: There should be a space between right parenthesis and an opening curly brace.

if(datatable[i,"Status"] == "Endemic" | datatable[i,"Status"] == "endemic" ){
                                                                                  ^

R/DAISIE_dataprep.R:203:34: style: Use <-, not =, for assignment.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                 ^

R/DAISIE_dataprep.R:203:68: style: Commas should always have a space after.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
                                                                   ^

R/DAISIE_dataprep.R:203:81: style: Lines should not be more than 80 characters.

​        levels(datatable$Status) = append(levels(datatable$Status),"Endemic_MaxAge")
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~^~~~

R/DAISIE_dataprep.R:204:21: style: Commas should always have a space after.

datatable[i,"Status"] <-"Endemic_MaxAge"}
                    ^

Please sign in to comment.