library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr 1.1.4 ✔ readr 2.1.5
## ✔ forcats 1.0.0 ✔ stringr 1.5.1
## ✔ ggplot2 3.5.1 ✔ tibble 3.2.1
## ✔ lubridate 1.9.3 ✔ tidyr 1.3.1
## ✔ purrr 1.0.2
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag() masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
iris.es <- iris %>%
rename(LONG.SEPALOS = Sepal.Length ,
ANCHO.SEPALOS = Sepal.Width ,
LONG.PETALOS = Petal.Length ,
ANCHO.PETALOS = Petal.Width ,
ESPECIES = Species)
ggplot(iris.es, aes(x = LONG.PETALOS, y = ANCHO.PETALOS))
ggplot(data = iris.es, aes(x = LONG.PETALOS, y = ANCHO.PETALOS)) +
geom_point()
### 3 PASO ES ELABORAR EL FACETADO (VARIOS GRAFICOS DENTRO DEL MISMO
GRAFICO) permite mostrar la relacion entre las vbles ## NOS MUESTRA LA
RELACION ENTRE LAS DOS VBLES PERO CON UN GRAFICO PARA C/U
ggplot(data = iris.es, aes(x = LONG.PETALOS, y = ANCHO.PETALOS)) +
geom_point() + facet_grid(ESPECIES ~.)
ggplot(data = iris.es, aes(x = LONG.PETALOS, y = ANCHO.PETALOS)) +
geom_point() + facet_grid(.~ESPECIES)
##EL TEMA (themes) permite cambiar la estetica
ggplot(data = iris.es, aes(x = LONG.PETALOS, y = ANCHO.PETALOS)) +
geom_point() + facet_grid(.~ESPECIES) + theme_dark() + theme_classic()
ggplot(data = iris.es, aes(x = LONG.PETALOS, y = ANCHO.PETALOS, colour = ESPECIES)) +
geom_point() +
facet_grid(.~ESPECIES) +
theme_dark() +
theme_classic()
iris.es %>%
mutate(AREA_PETALO = LONG.PETALOS*ANCHO.PETALOS) %>%
summarise(MEDIA_PET = mean(AREA_PETALO))
## MEDIA_PET
## 1 5.794067
iris.es %>%
mutate(AREA_SEPALOS = LONG.SEPALOS*ANCHO.SEPALOS) %>%
summarise(MEDIA_SEP = mean(AREA_SEPALOS))
## MEDIA_SEP
## 1 17.82287
iris.es %>%
group_by(ESPECIES) %>%
summarise(LONG_MEDIA_ESPECIE = mean(LONG.PETALOS))
## # A tibble: 3 × 2
## ESPECIES LONG_MEDIA_ESPECIE
## <fct> <dbl>
## 1 setosa 1.46
## 2 versicolor 4.26
## 3 virginica 5.55
CLASE NUMERO 3 08_11_2024
library("tidyverse")
library(tidyverse)
library(readxl)
(read_csv)
## function (file, col_names = TRUE, col_types = NULL, col_select = NULL,
## id = NULL, locale = default_locale(), na = c("", "NA"), quoted_na = TRUE,
## quote = "\"", comment = "", trim_ws = TRUE, skip = 0, n_max = Inf,
## guess_max = min(1000, n_max), name_repair = "unique", num_threads = readr_threads(),
## progress = show_progress(), show_col_types = should_show_types(),
## skip_empty_rows = TRUE, lazy = should_read_lazy())
## {
## if (edition_first()) {
## tokenizer <- tokenizer_csv(na = na, quoted_na = quoted_na,
## quote = quote, comment = comment, trim_ws = trim_ws,
## skip_empty_rows = skip_empty_rows)
## return(read_delimited(file, tokenizer, col_names = col_names,
## col_types = col_types, locale = locale, skip = skip,
## skip_empty_rows = skip_empty_rows, comment = comment,
## n_max = n_max, guess_max = guess_max, progress = progress,
## show_col_types = show_col_types))
## }
## if (!missing(quoted_na)) {
## lifecycle::deprecate_soft("2.0.0", "readr::read_csv(quoted_na = )")
## }
## vroom::vroom(file, delim = ",", col_names = col_names, col_types = col_types,
## col_select = {
## {
## col_select
## }
## }, id = id, .name_repair = name_repair, skip = skip,
## n_max = n_max, na = na, quote = quote, comment = comment,
## skip_empty_rows = skip_empty_rows, trim_ws = trim_ws,
## escape_double = TRUE, escape_backslash = FALSE, locale = locale,
## guess_max = guess_max, show_col_types = show_col_types,
## progress = progress, altrep = lazy, num_threads = num_threads)
## }
## <bytecode: 0x55b2764fed20>
## <environment: namespace:readr>
ALUMNOS_2024 <- read.csv("https://docs.google.com/document/d/1UqDg-hWalj5H0fKEcmXVT5jhdEabqaEDJ6M5DrrMf2Q/edit?usp=sharing")
names(ALUMNOS_2024)
## [1] "X..DOCTYPE.html..html.lang.en..head..meta.http.equiv.content.type.content.text.html..charset.UTF.8..script.nonce.LQiP2hf6dpJ2GbTzNMY6dg.var.DOCS_timing.....DOCS_timing..pls...new.Date...getTime.....script..meta.property.og.title.content.SCRIPT.DE.3..ENCUENTRO..meta.property.og.type.content.article..meta.property.og.site_name.content.Google.Docs..meta.property.og.url.content.https...docs.google.com.document.d.1UqDg.hWalj5H0fKEcmXVT5jhdEabqaEDJ6M5DrrMf2Q.edit.usp.sharing.amp.usp.embed_facebook..meta.property.og.image.content.https...lh7.us.googleusercontent.com.docs.AHkbwyLlbLrhP3s51UjHKq8UR2bNgATUUrtlNyX61FfpghUR2j.L7YYNWdtHVvp3OcMUKNMtqP5SYI_vaN8FIHjGM9Ea_SPb1ZGtaPXzDF1GYp7T8JzkT7vX.w1200.h630.p..meta.property.og.image.width.content.1200..meta.property.og.image.height.content.630..meta.property.og.description.content.SCRIPT.DE.3..ENCUENTRO.......r....Instalamos.y.o.cargamos.paquetes.library..quot.tidyverse.quot...library..quot.readxl.quot..........Función..read_csv.........r...ALUMNOS_2024..lt...read_csv..quot.https...docs.google.com.spreadsheets.d.e.2PACX.1vTwVt48G81FHfD_K9jcVmhjN3otTkR0.5Y8mC23oaEOTmhiG4So0kjw6I0b2tkU5ilpehvlhqBjId9i......meta.name.google.content.notranslate..meta.name.viewport.content.width.device.width..user.scalable.no..initial.scale.1.0..minimum.scale.1.0..maximum.scale.1.0..meta.http.equiv.X.UA.Compatible.content.IE.edge...meta.name.fragment.content....meta.name.referrer.content.origin..title.SCRIPT.DE.3..ENCUENTRO...Google.Docs..title..link.rel.shortcut.icon.href.https...ssl.gstatic.com.docs.documents.images.kix.favicon.2023q4.ico..link.rel.chrome.webstore.item.href.https...chrome.google.com.webstore.detail.apdfllckaahabafndbhieahigkjlhalf..script.nonce.LQiP2hf6dpJ2GbTzNMY6dg._docs_webfonts_fontFaces...null.._docs_webfonts_iframe_fontFaces...null.DOCS_timing..wpid...new.Date...getTime.....script..style.nonce.XsahMDldLtTMTXYMKjTwtw..gb_2d.not..gb_pe..font.13px.27px.Roboto"
## [2] "Arial"
## [3] "sans.serif.z.index.986...webkit.keyframes.gb__a.0..opacity.0.50..opacity.1...keyframes.gb__a.0..opacity.0.50..opacity.1..a.gb_Pa.border.none.color..4285f4.cursor.default.font.weight.bold.outline.none.position.relative.text.align.center.text.decoration.none.text.transform.uppercase.white.space.nowrap..moz.user.select.none..ms.user.select.none..webkit.user.select.none.a.gb_Pa.hover..after"
## [4] "a.gb_Pa.focus..after.background.color.rgba.0"
## [5] "X0"
## [6] "X0.1"
## [7] "X.12..content..height.100..left.0.position.absolute.top.0.width.100..a.gb_Pa.hover"
## [8] "a.gb_Pa.focus.text.decoration.none.a.gb_Pa.active.background.color.rgba.153"
## [9] "X153"
## [10] "X153.1"
## [11] "X.4..text.decoration.none.a.gb_Qa.background.color..4285f4.color..fff.a.gb_Qa.active.background.color..0043b2..gb_Ra.box.shadow.0.1px.1px.rgba.0"
## [12] "X0.2"
## [13] "X0.3"
## [14] "X.16...gb_Pa"
## [15] ".gb_Qa"
## [16] ".gb_Sa"
## [17] ".gb_Ta.display.inline.block.line.height.28px.padding.0.12px.border.radius.2px..gb_Sa.background..f8f8f8.border.1px.solid..c6c6c6..gb_Ta.background..f8f8f8..gb_Sa"
## [18] "X.gb.a.gb_Sa.gb_Sa"
## [19] ".gb_Ta.color..666.cursor.default.text.decoration.none..gb.a.gb_Ta.cursor.default.text.decoration.none..gb_Ta.border.1px.solid..4285f4.font.weight.bold.outline.none.background..4285f4.background..webkit.gradient.linear"
## [20] "left.top"
## [21] "left.bottom"
## [22] "from.top."
## [23] "color.stop..4387fd."
## [24] "to..4683ea...background..webkit.linear.gradient.top"
## [25] "X.4387fd"
## [26] "X.4683ea..background.linear.gradient.top"
## [27] "X.4387fd.1"
## [28] "X.4683ea..filter.progid.DXImageTransform.Microsoft.gradient.startColorstr..4387fd"
## [29] "endColorstr..4683ea"
## [30] "GradientType.0...gb.a.gb_Ta.color..fff..gb_Ta.hover.box.shadow.0.1px.0.rgba.0"
## [31] "X0.4"
## [32] "X0.5"
## [33] "X.15...gb_Ta.active.box.shadow.inset.0.2px.0.rgba.0"
## [34] "X0.6"
## [35] "X0.7"
## [36] "X.15..background..3c78dc.background..webkit.gradient.linear"
## [37] "left.top.1"
## [38] "left.bottom.1"
## [39] "from.top..1"
## [40] "color.stop..3c7ae4."
## [41] "to..3f76d3...background..webkit.linear.gradient.top"
## [42] "X.3c7ae4"
## [43] "X.3f76d3..background.linear.gradient.top"
## [44] "X.3c7ae4.1"
## [45] "X.3f76d3..filter.progid.DXImageTransform.Microsoft.gradient.startColorstr..3c7ae4"
## [46] "endColorstr..3f76d3"
## [47] "GradientType.0...gb..gb_Ua.background..fff.border.1px.solid..dadce0.color..1a73e8.display.inline.block.text.decoration.none..gb..gb_Ua.hover.background..f8fbff.border.color..dadce0.color..174ea6..gb..gb_Ua.focus.background..f4f8ff.color..174ea6.outline.1px.solid..174ea6..gb..gb_Ua.active"
## [48] "X.gb..gb_Ua.focus.active.background..ecf3fe.color..174ea6..gb..gb_Ua.gb_F.background.transparent.border.1px.solid..5f6368.color..8ab4f8.text.decoration.none..gb..gb_Ua.gb_F.hover.background.rgba.255"
## [49] "X255"
## [50] "X255.1"
## [51] "X.04..color..e8eaed..gb..gb_Ua.gb_F.focus.background.rgba.232"
## [52] "X234"
## [53] "X237"
## [54] "X.12..color..e8eaed.outline.1px.solid..e8eaed..gb..gb_Ua.gb_F.active"
## [55] "X.gb..gb_Ua.gb_F.focus.active.background.rgba.232"
## [56] "X234.1"
## [57] "X237.1"
## [58] "X.1..color..e8eaed..gb_bd.display.inline.block.vertical.align.middle..gb_Oe..gb_P.bottom..3px.right..5px..gb_C.position.relative..gb_A.display.inline.block.outline.none.vertical.align.middle.border.radius.2px..moz.box.sizing.border.box.box.sizing.border.box.height.40px.width.40px.cursor.pointer.text.decoration.none..gb.gb.a.gb_A.cursor.pointer.text.decoration.none..gb_A"
## [59] "a.gb_A.color..000..gb_cd.border.color.transparent.border.bottom.color..fff.border.style.dashed.dashed.solid.border.width.0.8.5px.8.5px.display.none.position.absolute.left.11.5px.top.33px.z.index.1.height.0.width.0..webkit.animation.gb__a..2s.animation.gb__a..2s..gb_dd.border.color.transparent.border.style.dashed.dashed.solid.border.width.0.8.5px.8.5px.display.none.position.absolute.left.11.5px.z.index.1.height.0.width.0..webkit.animation.gb__a..2s.animation.gb__a..2s.border.bottom.color.rgba.0"
## [60] "X0.8"
## [61] "X0.9"
## [62] "X.2..top.32px.x..o.prefocus"
## [63] "div.gb_dd.border.bottom.color..ccc..gb_ka.background..fff.border.1px.solid..ccc.border.color.rgba.0"
## [64] "X0.10"
## [65] "X0.11"
## [66] "X.2..color..000..webkit.box.shadow.0.2px.10px.rgba.0"
## [67] "X0.12"
## [68] "X0.13"
## [69] "X.2...moz.box.shadow.0.2px.10px.rgba.0"
## [70] "X0.14"
## [71] "X0.15"
## [72] "X.2..box.shadow.0.2px.10px.rgba.0"
## [73] "X0.16"
## [74] "X0.17"
## [75] "X.2..display.none.outline.none.overflow.hidden.position.absolute.right.8px.top.62px..webkit.animation.gb__a..2s.animation.gb__a..2s.border.radius.2px..moz.user.select.text..ms.user.select.text..webkit.user.select.text..gb_bd.gb_Sc..gb_cd"
## [76] ".gb_bd.gb_Sc..gb_dd"
## [77] ".gb_bd.gb_Sc..gb_ka"
## [78] ".gb_Sc.gb_ka.display.block..gb_bd.gb_Sc.gb_ed..gb_cd"
## [79] ".gb_bd.gb_Sc.gb_ed..gb_dd.display.none..gb_Pe.position.absolute.right.8px.top.62px.z.index..1..gb_fd..gb_cd"
## [80] ".gb_fd..gb_dd"
## [81] ".gb_fd..gb_ka.margin.top..10px..gb_bd.first.child"
## [82] "X.gbsfw.first.child..gb_bd.padding.left.4px..gb_Ea.gb_Qe..gb_bd.first.child.padding.left.0..gb_Re.position.relative..gb_1c..gb_Re"
## [83] ".gb_Id..gb_Re.float.right..gb_A.padding.8px.cursor.pointer..gb_A..after.content..position.absolute.top..4px.bottom..4px.left..4px.right..4px..gb_Ea..gb_gd.not..gb_Pa..focus.img.background.color.rgba.0"
## [84] "X0.18"
## [85] "X0.19"
## [86] "X.2..outline.none..webkit.border.radius.50...moz.border.radius.50..border.radius.50...gb_hd.button.svg"
## [87] ".gb_A..webkit.border.radius.50...moz.border.radius.50..border.radius.50...gb_hd.button.focus.not..focus.visible..svg"
## [88] ".gb_hd.button.hover.svg"
## [89] ".gb_hd.button.active.svg"
## [90] ".gb_A.focus.not..focus.visible."
## [91] ".gb_A.hover"
## [92] ".gb_A.active"
## [93] ".gb_A.aria.expanded.true..outline.none..gb_Kc..gb_hd.gb_id.button.focus.visible.svg"
## [94] ".gb_hd.button.focus.visible.svg"
## [95] ".gb_A.focus.visible.outline.1px.solid..202124..gb_Kc..gb_hd.button.focus.visible.svg"
## [96] ".gb_Kc..gb_A.focus.visible.outline.1px.solid..f1f3f4..media..forced.colors.active...gb_Kc..gb_hd.gb_id.button.focus.visible.svg"
## [97] ".gb_hd.button.focus.visible.svg.1"
## [98] ".gb_Kc..gb_hd.button.focus.visible.svg.outline.1px.solid.currentcolor...gb_Kc..gb_hd.gb_id.button.focus.svg"
## [99] ".gb_Kc..gb_hd.gb_id.button.focus.hover.svg"
## [100] ".gb_hd.button.focus.svg"
## [101] ".gb_hd.button.focus.hover.svg"
## [102] ".gb_A.focus"
## [103] ".gb_A.focus.hover.background.color.rgba.60"
## [104] "X64"
## [105] "X67"
## [106] "X.1...gb_Kc..gb_hd.gb_id.button.active.svg"
## [107] ".gb_hd.button.active.svg.1"
## [108] ".gb_A.active.background.color.rgba.60"
## [109] "X64.1"
## [110] "X67.1"
## [111] "X.12...gb_Kc..gb_hd.gb_id.button.hover.svg"
## [112] ".gb_hd.button.hover.svg.1"
## [113] ".gb_A.hover.background.color.rgba.60"
## [114] "X64.2"
## [115] "X67.2"
## [116] "X.08...gb_Va..gb_A.gb_Xa.hover.background.color.transparent..gb_A.aria.expanded.true."
## [117] ".gb_A.hover.aria.expanded.true..background.color.rgba.95"
## [118] "X99"
## [119] "X104"
## [120] "X.24...gb_A.aria.expanded.true...gb_E.fill..5f6368.opacity.1..gb_Kc..gb_hd.button.hover.svg"
## [121] ".gb_Kc..gb_A.hover.background.color.rgba.232"
## [122] "X234.2"
## [123] "X237.2"
## [124] "X.08...gb_Kc..gb_hd.button.focus.svg"
## [125] ".gb_Kc..gb_hd.button.focus.hover.svg"
## [126] ".gb_Kc..gb_A.focus"
## [127] ".gb_Kc..gb_A.focus.hover.background.color.rgba.232"
## [128] "X234.3"
## [129] "X237.3"
## [130] "X.1...gb_Kc..gb_hd.button.active.svg"
## [131] ".gb_Kc..gb_A.active.background.color.rgba.232"
## [132] "X234.4"
## [133] "X237.4"
## [134] "X.12...gb_Kc..gb_A.aria.expanded.true."
## [135] ".gb_Kc..gb_A.hover.aria.expanded.true..background.color.rgba.255"
## [136] "X255.2"
## [137] "X255.3"
## [138] "X.12...gb_Kc..gb_A.aria.expanded.true...gb_E.fill..fff.opacity.1..gb_bd.padding.4px..gb_Ea.gb_Qe..gb_bd.padding.4px.2px..gb_Ea.gb_Qe..gb_y.gb_bd.padding.left.6px..gb_ka.z.index.991.line.height.normal..gb_ka.gb_jd.left.0.right.auto..media..max.width.350px...gb_ka.gb_jd.left.0...gb_Se..gb_ka.top.56px..gb_Q.display.none.important..gb_md.visibility.hidden..gb_I..gb_A"
## [139] ".gb_ja..gb_I..gb_A.background.position..64px..29px..gb_0..gb_I..gb_A.background.position..29px..29px.opacity.1..gb_I..gb_A"
## [140] ".gb_I..gb_A.hover"
## [141] ".gb_I..gb_A.focus.opacity.1..gb_K.display.none..media.screen.and..max.width.319px...gb_kd.not..gb_ld...gb_I.display.none.visibility.hidden...gb_P.display.none..gb_8c.font.family.Google.Sans"
## [142] "Roboto"
## [143] "Helvetica"
## [144] "Arial.1"
## [145] "sans.serif.font.size.20px.font.weight.400.letter.spacing.0.25px.line.height.48px.margin.bottom.2px.opacity.1.overflow.hidden.padding.left.16px.position.relative.text.overflow.ellipsis.vertical.align.middle.top.2px.white.space.nowrap..ms.flex.1.1.auto..webkit.flex.1.1.auto..webkit.box.flex.1..moz.box.flex.1.flex.1.1.auto..gb_8c.gb_9c.color..3c4043..gb_Ea.gb_bc..gb_8c.margin.bottom.0..gb_rd.gb_td..gb_8c.padding.left.4px..gb_Ea.gb_bc..gb_ud.position.relative.top..2px..gb_ad.display.none..gb_Ea.color.black.min.width.160px.position.relative..webkit.transition.box.shadow.250ms.transition.box.shadow.250ms..gb_Ea.gb_Rc.min.width.120px..gb_Ea.gb_vd..gb_wd.display.none..gb_Ea.gb_vd..gb_kd.height.56px.header.gb_Ea.display.block..gb_Ea.svg.fill.currentColor..gb_Cd.position.fixed.top.0.width.100...gb_xd..webkit.box.shadow.0.4px.5px.0.rgba.0"
## [146] "X0.20"
## [147] "X0.21"
## [148] "X.14."
## [149] "X0.1px.10px.0.rgba.0"
## [150] "X0.22"
## [151] "X0.23"
## [152] "X.12."
## [153] "X0.2px.4px..1px.rgba.0"
## [154] "X0.24"
## [155] "X0.25"
## [156] "X.2...moz.box.shadow.0.4px.5px.0.rgba.0"
## [157] "X0.26"
## [158] "X0.27"
## [159] "X.14..1"
## [160] "X0.1px.10px.0.rgba.0.1"
## [161] "X0.28"
## [162] "X0.29"
## [163] "X.12..1"
## [164] "X0.2px.4px..1px.rgba.0.1"
## [165] "X0.30"
## [166] "X0.31"
## [167] "X.2..box.shadow.0.4px.5px.0.rgba.0"
## [168] "X0.32"
## [169] "X0.33"
## [170] "X.14..2"
## [171] "X0.1px.10px.0.rgba.0.2"
## [172] "X0.34"
## [173] "X0.35"
## [174] "X.12..2"
## [175] "X0.2px.4px..1px.rgba.0.2"
## [176] "X0.36"
## [177] "X0.37"
## [178] "X.2...gb_Dd.height.64px..gb_kd..moz.box.sizing.border.box..webkit.box.sizing.border.box.box.sizing.border.box.position.relative.width.100..display..webkit.box.display..moz.box.display..ms.flexbox.display..webkit.flex.display.flex..webkit.box.pack.space.between..ms.flex.pack.justify..webkit.justify.content.space.between..moz.box.pack.space.between.justify.content.space.between.min.width..webkit.min.content.min.width..moz.min.content.min.width..ms.min.content.min.width.min.content..gb_Ea.not..gb_bc...gb_kd.padding.8px..gb_Ea.gb_Ed..gb_kd..ms.flex.1.0.auto..webkit.flex.1.0.auto..webkit.box.flex.1..moz.box.flex.1.flex.1.0.auto..gb_Ea..gb_kd.gb_ld.gb_Fd.min.width.0..gb_Ea.gb_bc..gb_kd.padding.4px.padding.left.8px.min.width.0..gb_wd.height.48px.vertical.align.middle.white.space.nowrap..ms.flex.align.center..moz.box.align.center..webkit.box.align.center..webkit.align.items.center.align.items.center.display..webkit.box.display..moz.box.display..ms.flexbox.display..webkit.flex.display.flex..moz.user.select..moz.none..ms.user.select.none..webkit.user.select.none..gb_zd..gb_wd.display.table.cell.width.100...gb_rd.padding.right.30px..moz.box.sizing.border.box.box.sizing.border.box..ms.flex.1.0.auto..webkit.flex.1.0.auto..webkit.box.flex.1..moz.box.flex.1.flex.1.0.auto..gb_Ea.gb_bc..gb_rd.padding.right.14px..gb_Ad..ms.flex.1.1.100...webkit.flex.1.1.100...webkit.box.flex.1..moz.box.flex.1.flex.1.1.100...gb_Ad..only.child.display.inline.block..gb_Bd.gb_2c.padding.left.4px..gb_Bd.gb_Hd"
## [179] ".gb_Ea.gb_Ed..gb_Bd"
## [180] ".gb_Ea.gb_bc.not..gb_Id...gb_Bd.padding.left.0..gb_Ea.gb_bc..gb_Bd.gb_Hd.padding.right.0..gb_Ea.gb_bc..gb_Bd.gb_Hd..gb_Va.margin.left.10px..gb_2c.display.inline..gb_Ea.gb_Vc..gb_Bd.gb_Jd"
## [181] ".gb_Ea.gb_Id..gb_Bd.gb_Jd.padding.left.2px..gb_8c.display.inline.block..gb_Bd..moz.box.sizing.border.box..webkit.box.sizing.border.box.box.sizing.border.box.height.48px.line.height.normal.padding.0.4px.padding.left.30px..ms.flex.0.0.auto..webkit.flex.0.0.auto..webkit.box.flex.0..moz.box.flex.0.flex.0.0.auto..webkit.box.pack.flex.end..ms.flex.pack.end..webkit.justify.content.flex.end..moz.box.pack.flex.end.justify.content.flex.end..gb_Id.height.48px..gb_Ea.gb_Id.min.width.auto..gb_Id..gb_Bd.float.right.padding.left.32px..gb_Id..gb_Bd.gb_Kd.padding.left.0..gb_Ld.font.size.14px.max.width.200px.overflow.hidden.padding.0.12px.text.overflow.ellipsis.white.space.nowrap..moz.user.select.text..ms.user.select.text..webkit.user.select.text..gb_od..webkit.transition.background.color..4s..webkit.transition.background.color..4s..o.transition.background.color..4s.transition.background.color..4s..gb_Md.color.black..gb_Kc.color.white..gb_Ea.a"
## [182] ".gb_Oc.a.color.inherit..gb_aa.color.rgba.0"
## [183] "X0.38"
## [184] "X0.39"
## [185] "X.87...gb_Ea.svg"
## [186] ".gb_Oc.svg"
## [187] ".gb_rd..gb_sd"
## [188] ".gb_1c..gb_sd.color..5f6368.opacity.1..gb_Kc.svg"
## [189] ".gb_Oc.gb_Tc.svg"
## [190] ".gb_Kc..gb_rd..gb_sd"
## [191] ".gb_Kc..gb_rd..gb_Jc"
## [192] ".gb_Kc..gb_rd..gb_ud"
## [193] ".gb_Oc.gb_Tc..gb_sd.color.rgba.255"
## [194] "X255.4"
## [195] "X255.5"
## [196] "X.87...gb_Kc..gb_rd..gb_Nd.not..gb_Od..opacity..87..gb_9c.color.inherit.opacity.1.text.rendering.optimizeLegibility..webkit.font.smoothing.antialiased..moz.osx.font.smoothing.grayscale..gb_Kc..gb_9c"
## [197] ".gb_Md..gb_9c.opacity.1..gb_Pd.position.relative..gb_L.font.family.arial"
## [198] "sans.serif.line.height.normal.padding.right.15px.a.gb_W"
## [199] "span.gb_W.color.rgba.0"
## [200] "X0.40"
## [201] "X0.41"
## [202] "X.87..text.decoration.none..gb_Kc.a.gb_W"
## [203] ".gb_Kc.span.gb_W.color.white.a.gb_W.focus.outline.offset.2px.a.gb_W.hover.text.decoration.underline..gb_X.display.inline.block.padding.left.15px..gb_X..gb_W.display.inline.block.line.height.24px.vertical.align.middle..gb_pd.font.family.Google.Sans"
## [204] "Roboto.1"
## [205] "Helvetica.1"
## [206] "Arial.2"
## [207] "sans.serif.font.weight.500.font.size.14px.letter.spacing..25px.line.height.16px.margin.left.10px.margin.right.8px.min.width.96px.padding.9px.23px.text.align.center.vertical.align.middle.border.radius.4px..moz.box.sizing.border.box.box.sizing.border.box..gb_Ea.gb_Id..gb_pd.margin.left.8px..gb.a.gb_Ta.gb_pd.cursor.pointer..gb_Ta.gb_pd.hover.background..1b66c9..webkit.box.shadow.0.1px.3px.1px.rgba.66"
## [208] "X64.3"
## [209] "X67.3"
## [210] "X.15."
## [211] "X0.1px.2px.0.rgba.60"
## [212] "X64.4"
## [213] "X67.4"
## [214] "X.3...moz.box.shadow.0.1px.3px.1px.rgba.66"
## [215] "X64.5"
## [216] "X67.5"
## [217] "X.15..1"
## [218] "X0.1px.2px.0.rgba.60.1"
## [219] "X64.6"
## [220] "X67.6"
## [221] "X.3..box.shadow.0.1px.3px.1px.rgba.66"
## [222] "X64.7"
## [223] "X67.7"
## [224] "X.15..2"
## [225] "X0.1px.2px.0.rgba.60.2"
## [226] "X64.8"
## [227] "X67.8"
## [228] "X.3...gb_Ta.gb_pd.focus"
## [229] ".gb_Ta.gb_pd.hover.focus.background..1c5fba..webkit.box.shadow.0.1px.3px.1px.rgba.66"
## [230] "X64.9"
## [231] "X67.9"
## [232] "X.15..3"
## [233] "X0.1px.2px.0.rgba.60.3"
## [234] "X64.10"
## [235] "X67.10"
## [236] "X.3...moz.box.shadow.0.1px.3px.1px.rgba.66.1"
## [237] "X64.11"
## [238] "X67.11"
## [239] "X.15..4"
## [240] "X0.1px.2px.0.rgba.60.4"
## [241] "X64.12"
## [242] "X67.12"
## [243] "X.3..box.shadow.0.1px.3px.1px.rgba.66.1"
## [244] "X64.13"
## [245] "X67.13"
## [246] "X.15..5"
## [247] "X0.1px.2px.0.rgba.60.5"
## [248] "X64.14"
## [249] "X67.14"
## [250] "X.3...gb_Ta.gb_pd.active.background..1b63c1..webkit.box.shadow.0.1px.3px.1px.rgba.66"
## [251] "X64.15"
## [252] "X67.15"
## [253] "X.15..6"
## [254] "X0.1px.2px.0.rgba.60.6"
## [255] "X64.16"
## [256] "X67.16"
## [257] "X.3...moz.box.shadow.0.1px.3px.1px.rgba.66.2"
## [258] "X64.17"
## [259] "X67.17"
## [260] "X.15..7"
## [261] "X0.1px.2px.0.rgba.60.7"
## [262] "X64.18"
## [263] "X67.18"
## [264] "X.3..box.shadow.0.1px.3px.1px.rgba.66.2"
## [265] "X64.19"
## [266] "X67.19"
## [267] "X.15..8"
## [268] "X0.1px.2px.0.rgba.60.8"
## [269] "X64.20"
## [270] "X67.20"
## [271] "X.3...gb_pd.background..1a73e8.border.1px.solid.transparent..gb_Ea.gb_bc..gb_pd.padding.9px.15px.min.width.80px..gb_Qd.text.align.left..gb..gb_Kc.a.gb_pd.not..gb_F."
## [272] "X.gb.gb_Kc.a.gb_pd.background..fff.border.color..dadce0..webkit.box.shadow.none..moz.box.shadow.none.box.shadow.none.color..1a73e8..gb.a.gb_Ta.gb_F.gb_pd.background..8ab4f8.border.1px.solid.transparent..webkit.box.shadow.none..moz.box.shadow.none.box.shadow.none.color..202124..gb..gb_Kc.a.gb_pd.hover.not..gb_F."
## [273] "X.gb.gb_Kc.a.gb_pd.hover.background..f8fbff.border.color..cce0fc..gb.a.gb_Ta.gb_F.gb_pd.hover.background..93baf9.border.color.transparent..webkit.box.shadow.0.1px.3px.1px.rgba.0"
## [274] "X0.42"
## [275] "X0.43"
## [276] "X.15..9"
## [277] "X0.1px.2px.rgba.0"
## [278] "X0.44"
## [279] "X0.45"
## [280] "X.3...moz.box.shadow.0.1px.3px.1px.rgba.0"
## [281] "X0.46"
## [282] "X0.47"
## [283] "X.15..10"
## [284] "X0.1px.2px.rgba.0.1"
## [285] "X0.48"
## [286] "X0.49"
## [287] "X.3..box.shadow.0.1px.3px.1px.rgba.0"
## [288] "X0.50"
## [289] "X0.51"
## [290] "X.15..11"
## [291] "X0.1px.2px.rgba.0.2"
## [292] "X0.52"
## [293] "X0.53"
## [294] "X.3...gb..gb_Kc.a.gb_pd.focus.not..gb_F."
## [295] "X.gb..gb_Kc.a.gb_pd.focus.hover.not..gb_F."
## [296] "X.gb.gb_Kc.a.gb_pd.focus.not..gb_F."
## [297] "X.gb.gb_Kc.a.gb_pd.focus.hover.not..gb_F..background..f4f8ff.outline.1px.solid..c9ddfc..gb.a.gb_Ta.gb_F.gb_pd.focus"
## [298] "X.gb.a.gb_Ta.gb_F.gb_pd.focus.hover.background..a6c6fa.border.color.transparent..webkit.box.shadow.none..moz.box.shadow.none.box.shadow.none..gb..gb_Kc.a.gb_pd.active.not..gb_F."
## [299] "X.gb.gb_Kc.a.gb_pd.active.background..ecf3fe..gb.a.gb_Ta.gb_F.gb_pd.active.background..a1c3f9..webkit.box.shadow.0.1px.2px.rgba.60"
## [300] "X64.21"
## [301] "X67.21"
## [302] "X.3."
## [303] "X0.2px.6px.2px.rgba.60"
## [304] "X64.22"
## [305] "X67.22"
## [306] "X.15...moz.box.shadow.0.1px.2px.rgba.60"
## [307] "X64.23"
## [308] "X67.23"
## [309] "X.3..1"
## [310] "X0.2px.6px.2px.rgba.60.1"
## [311] "X64.24"
## [312] "X67.24"
## [313] "X.15..box.shadow.0.1px.2px.rgba.60"
## [314] "X64.25"
## [315] "X67.25"
## [316] "X.3..2"
## [317] "X0.2px.6px.2px.rgba.60.2"
## [318] "X64.26"
## [319] "X67.26"
## [320] "X.15...gb_J.display.none..media.screen.and..max.width.319px...gb_kd..gb_I.display.none.visibility.hidden...gb_Va.background.color.rgba.255"
## [321] "X255.6"
## [322] "X255.7"
## [323] "X.88..border.1px.solid..dadce0..moz.box.sizing.border.box..webkit.box.sizing.border.box.box.sizing.border.box.cursor.pointer.display.inline.block.max.height.48px.overflow.hidden.outline.none.padding.0.vertical.align.middle.width.134px..webkit.border.radius.8px..moz.border.radius.8px.border.radius.8px..gb_Va.gb_F.background.color.transparent.border.1px.solid..5f6368..gb_2a.display.inherit..gb_Va.gb_F..gb_2a.background..fff..webkit.border.radius.4px..moz.border.radius.4px.border.radius.4px.display.inline.block.left.8px.margin.right.5px.position.relative.padding.3px.top..1px..gb_Va.hover.border.1px.solid..d2e3fc.background.color.rgba.248"
## [324] "X250"
## [325] "X255.8"
## [326] "X.88...gb_Va.gb_F.hover.background.color.rgba.241"
## [327] "X243"
## [328] "X244"
## [329] "X.04..border.1px.solid..5f6368..gb_Va.focus.visible"
## [330] ".gb_Va.focus.background.color..fff.outline.1px.solid..202124..webkit.box.shadow.0.1px.2px.0.rgba.60"
## [331] "X64.27"
## [332] "X67.27"
## [333] "X.3..3"
## [334] "X0.1px.3px.1px.rgba.60"
## [335] "X64.28"
## [336] "X67.28"
## [337] "X.15...moz.box.shadow.0.1px.2px.0.rgba.60"
## [338] "X64.29"
## [339] "X67.29"
## [340] "X.3..4"
## [341] "X0.1px.3px.1px.rgba.60.1"
## [342] "X64.30"
## [343] "X67.30"
## [344] "X.15..box.shadow.0.1px.2px.0.rgba.60"
## [345] "X64.31"
## [346] "X67.31"
## [347] "X.3..5"
## [348] "X0.1px.3px.1px.rgba.60.2"
## [349] "X64.32"
## [350] "X67.32"
## [351] "X.15...gb_Va.gb_F.focus.visible"
## [352] ".gb_Va.gb_F.focus.background.color.rgba.241"
## [353] "X243.1"
## [354] "X244.1"
## [355] "X.12..outline.1px.solid..f1f3f4..webkit.box.shadow.0.1px.3px.1px.rgba.0"
## [356] "X0.54"
## [357] "X0.55"
## [358] "X.15..12"
## [359] "X0.1px.2px.0.rgba.0"
## [360] "X0.56"
## [361] "X0.57"
## [362] "X.3...moz.box.shadow.0.1px.3px.1px.rgba.0.1"
## [363] "X0.58"
## [364] "X0.59"
## [365] "X.15..13"
## [366] "X0.1px.2px.0.rgba.0.1"
## [367] "X0.60"
## [368] "X0.61"
## [369] "X.3..box.shadow.0.1px.3px.1px.rgba.0.1"
## [370] "X0.62"
## [371] "X0.63"
## [372] "X.15..14"
## [373] "X0.1px.2px.0.rgba.0.2"
## [374] "X0.64"
## [375] "X0.65"
## [376] "X.3...gb_Va.gb_F.active"
## [377] ".gb_Va.gb_Sc.gb_F.focus.background.color.rgba.241"
## [378] "X243.2"
## [379] "X244.2"
## [380] "X.1..border.1px.solid..5f6368..gb_3a.display.inline.block.padding.bottom.2px.padding.left.7px.padding.top.2px.text.align.center.vertical.align.middle.line.height.32px.width.78px..gb_Va.gb_F..gb_3a.line.height.26px.margin.left.0.padding.bottom.0.padding.left.0.padding.top.0.width.72px..gb_3a.gb_4a.background.color..f1f3f4..webkit.border.radius.4px..moz.border.radius.4px.border.radius.4px.margin.left.8px.padding.left.0.line.height.30px..gb_3a.gb_4a..gb_Hc.vertical.align.middle..gb_Ea.not..gb_bc...gb_Va.margin.left.10px.margin.right.4px..gb_Rd.max.height.32px.width.78px..gb_Va.gb_F..gb_Rd.max.height.26px.width.72px..gb_O..webkit.background.size.32px.32px..o.background.size.32px.32px.background.size.32px.32px.border.0..webkit.border.radius.50...moz.border.radius.50..border.radius.50..display.block.margin.0px.position.relative.height.32px.width.32px.z.index.0..gb_db.background.color..e8f0fe.border.1px.solid.rgba.32"
## [381] "X33"
## [382] "X36"
## [383] "X.08..position.relative..gb_db.gb_O.height.30px.width.30px..gb_db.gb_O.hover"
## [384] ".gb_db.gb_O.active..webkit.box.shadow.none..moz.box.shadow.none.box.shadow.none..gb_eb.background..fff.border.none..webkit.border.radius.50...moz.border.radius.50..border.radius.50..bottom.2px..webkit.box.shadow.0px.1px.2px.0px.rgba.60"
## [385] "X64.33"
## [386] "X67.33"
## [387] "X.30."
## [388] "X0px.1px.3px.1px.rgba.60"
## [389] "X64.34"
## [390] "X67.34"
## [391] "X.15...moz.box.shadow.0px.1px.2px.0px.rgba.60"
## [392] "X64.35"
## [393] "X67.35"
## [394] "X.30..1"
## [395] "X0px.1px.3px.1px.rgba.60.1"
## [396] "X64.36"
## [397] "X67.36"
## [398] "X.15..box.shadow.0px.1px.2px.0px.rgba.60"
## [399] "X64.37"
## [400] "X67.37"
## [401] "X.30..2"
## [402] "X0px.1px.3px.1px.rgba.60.2"
## [403] "X64.38"
## [404] "X67.38"
## [405] "X.15..height.14px.margin.2px.position.absolute.right.0.width.14px..gb_vc.color..1f71e7.font.400.22px.32px.Google.Sans"
## [406] "Roboto.2"
## [407] "Helvetica.2"
## [408] "Arial.3"
## [409] "sans.serif.text.align.center.text.transform.uppercase..media...webkit.min.device.pixel.ratio.1.25."
## [410] "X.min.resolution.1.25dppx."
## [411] "X.min.device.pixel.ratio.1.25...gb_O..before"
## [412] ".gb_fb..before.display.inline.block..webkit.transform.scale.0.5...webkit.transform.scale.0.5...ms.transform.scale.0.5...o.transform.scale.0.5..transform.scale.0.5...webkit.transform.origin.left.0..webkit.transform.origin.left.0..ms.transform.origin.left.0..o.transform.origin.left.0.transform.origin.left.0..gb_2..gb_fb..before..webkit.transform.scale.scale.0.416666667....webkit.transform.scale.scale.0.416666667....ms.transform.scale.scale.0.416666667....o.transform.scale.scale.0.416666667...transform.scale.scale.0.416666667.....gb_O.hover"
## [413] ".gb_O.focus..webkit.box.shadow.0.1px.0.rgba.0"
## [414] "X0.66"
## [415] "X0.67"
## [416] "X.15...moz.box.shadow.0.1px.0.rgba.0"
## [417] "X0.68"
## [418] "X0.69"
## [419] "X.15..box.shadow.0.1px.0.rgba.0"
## [420] "X0.70"
## [421] "X0.71"
## [422] "X.15...gb_O.active..webkit.box.shadow.inset.0.2px.0.rgba.0"
## [423] "X0.72"
## [424] "X0.73"
## [425] "X.15...moz.box.shadow.inset.0.2px.0.rgba.0"
## [426] "X0.74"
## [427] "X0.75"
## [428] "X.15..box.shadow.inset.0.2px.0.rgba.0"
## [429] "X0.76"
## [430] "X0.77"
## [431] "X.15...gb_O.active..after.background.rgba.0"
## [432] "X0.78"
## [433] "X0.79"
## [434] "X.1...webkit.border.radius.50...moz.border.radius.50..border.radius.50..content..display.block.height.100...gb_gb.cursor.pointer.line.height.40px.min.width.30px.opacity..75.overflow.hidden.vertical.align.middle.text.overflow.ellipsis..gb_A.gb_gb.width.auto..gb_gb.hover"
## [435] ".gb_gb.focus.opacity..85..gb_fd..gb_gb"
## [436] ".gb_fd..gb_Ud.line.height.26px..gb.gb.gb_fd.a.gb_gb"
## [437] ".gb_fd..gb_Ud.font.size.11px.height.auto..gb_hb.border.top.4px.solid..000.border.left.4px.dashed.transparent.border.right.4px.dashed.transparent.display.inline.block.margin.left.6px.opacity..75.vertical.align.middle..gb_Xa.hover..gb_hb.opacity..85..gb_Va..gb_y.padding.3px.3px.3px.4px..gb_Vd.gb_md.color..fff..gb_0..gb_gb"
## [438] ".gb_0..gb_hb.opacity.1..gb.gb.gb_0.gb_0.a.gb_gb"
## [439] "X.gb.gb..gb_0.gb_0.a.gb_gb.color..fff..gb_0.gb_0..gb_hb.border.top.color..fff.opacity.1..gb_ja..gb_O.hover"
## [440] ".gb_0..gb_O.hover"
## [441] ".gb_ja..gb_O.focus"
## [442] ".gb_0..gb_O.focus..webkit.box.shadow.0.1px.0.rgba.0"
## [443] "X0.80"
## [444] "X0.81"
## [445] "X.15..15"
## [446] "X0.1px.2px.rgba.0.3"
## [447] "X0.82"
## [448] "X0.83"
## [449] "X.2...moz.box.shadow.0.1px.0.rgba.0"
## [450] "X0.84"
## [451] "X0.85"
## [452] "X.15..16"
## [453] "X0.1px.2px.rgba.0.4"
## [454] "X0.86"
## [455] "X0.87"
## [456] "X.2..box.shadow.0.1px.0.rgba.0"
## [457] "X0.88"
## [458] "X0.89"
## [459] "X.15..17"
## [460] "X0.1px.2px.rgba.0.5"
## [461] "X0.90"
## [462] "X0.91"
## [463] "X.2...gb_Wd..gb_y"
## [464] ".gb_Xd..gb_y.position.absolute.right.1px..gb_y.gb_Z"
## [465] ".gb_ib.gb_Z"
## [466] ".gb_Xa.gb_Z..webkit.flex.0.1.auto..webkit.box.flex.0..moz.box.flex.0..ms.flex.0.1.auto.flex.0.1.auto..gb_Zd.gb_0d..gb_gb.width.30px.important..gb_1d.height.40px.position.absolute.right..5px.top..5px.width.40px..gb_2d..gb_1d"
## [467] ".gb_3d..gb_1d.right.0.top.0..gb_y..gb_A.padding.4px..gb_R.display.none.sentinel....style..script.nonce.LQiP2hf6dpJ2GbTzNMY6dg.DOCS_timing..ojls...new.Date...getTime.....script..script.nonce.LQiP2hf6dpJ2GbTzNMY6dg..this.gbar_..CONFIG....0"
## [468] "www.gstatic.com"
## [469] "og.qtm.en_US.5qmWYXNvCHE.es5.O"
## [470] "com"
## [471] "en"
## [472] "X25"
## [473] "X0.92"
## [474] "X.4"
## [475] "X2"
## [476] "X"
## [477] "X.2"
## [478] "X.3"
## [479] "X692856418"
## [480] "X0."
## [481] "null"
## [482] "QpYuZ57NIoTCwt0P7pGCwAE"
## [483] "null.1"
## [484] "X0.93"
## [485] "og.qtm.UilC253ZVrU.L.X.O"
## [486] "AA2YrTtEjd9SsYEvGZqQ1DMWNLHA5e.zxA"
## [487] "AA2YrTtYMD1OWSCYDZS1rprwANbjD2UJxg"
## [488] "X.5"
## [489] "X2.1"
## [490] "X1"
## [491] "X200"
## [492] "USA"
## [493] "null.2"
## [494] "null.3"
## [495] "X25.1"
## [496] "X25.2"
## [497] "X1.1"
## [498] "null.4"
## [499] "null.5"
## [500] "X72175901"
## [501] "X1.2"
## [502] "X0..1"
## [503] "null.6"
## [504] "X.1"
## [505] "X0.1000000014901161"
## [506] "X2.2"
## [507] "X1."
## [508] "null.7"
## [509] "X.0"
## [510] "X0.94"
## [511] "X0.95"
## [512] "null.8"
## [513] "X.6"
## [514] "X.7"
## [515] "X.8"
## [516] "X.9"
## [517] "X0.96"
## [518] "X0.97"
## [519] "X0.98"
## [520] "X."
## [521] "X.0.1"
## [522] "X0.99"
## [523] "X.10"
## [524] "X1.3"
## [525] "X0.100"
## [526] "X0.101"
## [527] "X0.102"
## [528] "X0.103"
## [529] "X0.104"
## [530] "X0.105"
## [531] "null.9"
## [532] "X0.106"
## [533] "X0.107"
## [534] "null.10"
## [535] "X0.108"
## [536] "X0.109"
## [537] "null.11"
## [538] "null.12"
## [539] "X0.110"
## [540] "X0.111"
## [541] "X0.112"
## [542] "X.11"
## [543] "X.12"
## [544] "X.13"
## [545] "X.14"
## [546] "X.15"
## [547] "X.16"
## [548] "null.13"
## [549] "X0.113"
## [550] "X0.114"
## [551] "X0.115"
## [552] "X0.116"
## [553] "X0.117"
## [554] "null.14"
## [555] "null.15"
## [556] "null.16"
## [557] "rgba.32.33.36.1."
## [558] "rgba.255.255.255.1."
## [559] "X0.118"
## [560] "X0.119"
## [561] "X0.120"
## [562] "null.17"
## [563] "null.18"
## [564] "null.19"
## [565] "X0..2"
## [566] "null.20"
## [567] "null.21"
## [568] "X.1.1"
## [569] "gci_91f30755d6a6b787dcc2a4062e6e9824.js"
## [570] "googleapis.client.gapi.iframes"
## [571] "X.17"
## [572] "en."
## [573] "null.22"
## [574] "null.23"
## [575] "null.24"
## [576] "null.25"
## [577] "X.m.._.scs.abc.static._.js.k.gapi.gapi.en.SGzW6IeCawI.O.am.AACA.d.1.rs.AHpOoo.5biO9jua.6zCEovdoDJ8SLzd6sw.m.__features__"
## [578] "https...apis.google.com"
## [579] "X.18"
## [580] "X.19"
## [581] "X.20"
## [582] "X.21"
## [583] "null.26"
## [584] "X1.4"
## [585] "es_plusone_gc_20241007.0_p2"
## [586] "en.1"
## [587] "null.27"
## [588] "X0..3"
## [589] "X.0.009999999776482582"
## [590] "com.1"
## [591] "X25.3"
## [592] "X.null"
## [593] "X.22"
## [594] "X0.121"
## [595] "null.28"
## [596] "X1.5"
## [597] "X5184000"
## [598] "null.29"
## [599] "null.30"
## [600] "X.23"
## [601] "null.31"
## [602] "null.32"
## [603] "null.33"
## [604] "null.34"
## [605] "null.35"
## [606] "X0.122"
## [607] "null.36"
## [608] "X0.123"
## [609] "null.37"
## [610] "X1.6"
## [611] "X0.124"
## [612] "X0.125"
## [613] "X0.126"
## [614] "null.38"
## [615] "null.39"
## [616] "X0.127"
## [617] "X0.128"
## [618] "null.40"
## [619] "X0.129"
## [620] "X0.130"
## [621] "X0.131"
## [622] "X0.132"
## [623] "X0..4"
## [624] "null.41"
## [625] "null.42"
## [626] "null.43"
## [627] "X0..5"
## [628] "X.1.2"
## [629] "null.44"
## [630] "null.45"
## [631] "X27043"
## [632] "X25.4"
## [633] "USA.1"
## [634] "en.2"
## [635] "X692856418.0"
## [636] "X8"
## [637] "null.46"
## [638] "X0.133"
## [639] "X0.134"
## [640] "null.47"
## [641] "null.48"
## [642] "null.49"
## [643] "null.50"
## [644] "X3700949"
## [645] "null.51"
## [646] "null.52"
## [647] "null.53"
## [648] "QpYuZ57NIoTCwt0P7pGCwAE.1"
## [649] "X0.135"
## [650] "X0.136"
## [651] "X0.137"
## [652] "null.54"
## [653] "X2.3"
## [654] "X5"
## [655] "ug"
## [656] "X130"
## [657] "X0.138"
## [658] "X0.139"
## [659] "X0.140"
## [660] "X0.141"
## [661] "X1.7"
## [662] "X72175901.1"
## [663] "X0.142"
## [664] "X0..6"
## [665] "X..null"
## [666] "null.55"
## [667] "null.56"
## [668] "https...www.gstatic.com.og._.js.k.og.qtm.en_US.5qmWYXNvCHE.es5.O.rt.j.m.qabr.q_dnp.qapid.qads.q_dg.exm.qaaw.qadd.qaid.qein.qhaw.qhba.qhbr.qhch.qhga.qhid.qhin.d.1.ed.1.rs.AA2YrTtEjd9SsYEvGZqQ1DMWNLHA5e.zxA...."
## [669] "X..this.gbar_.this.gbar_......function._..var.window.this."
ACÀ COPIE LOS CHUNKS QUE EL PROFE PUSO
# Instalamos y/o cargamos paquetes
library("tidyverse")
library("readxl")
read_csv()ALUMNOS_2024 <- read_csv("https://docs.google.com/spreadsheets/d/e/2PACX-1vTwVt48G81FHfD_K9jcVmhjN3otTkR0-5Y8mC23oaEOTmhiG4So0kjw6I0b2tkU5ilpehvlhqBjId9i/pub?output=csv")
## Rows: 24 Columns: 5
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (3): Marca temporal, Género, ¿Qué tan difícil le resulta el aprendizaje ...
## dbl (2): Edad, ¿Cuántas asignaturas rendiste y aprobaste este año?
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
names(ALUMNOS_2024)
## [1] "Marca temporal"
## [2] "Género"
## [3] "Edad"
## [4] "¿Qué tan difícil le resulta el aprendizaje del software R y RStudio?"
## [5] "¿Cuántas asignaturas rendiste y aprobaste este año?"
MANDARINAS <- read_excel("MANDARINAS_2024.xlsx")
glimpse(MANDARINAS)
## Rows: 419
## Columns: 8
## $ N <dbl> 1, 2, 3, 4, 5, 6, 7, 8, 9, 10, 11, 12, 13, 14, 15, 16, 1…
## $ GRUPO <dbl> 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1,…
## $ VARIEDAD <chr> "Clementina", "Clementina", "Clementina", "Clementina", …
## $ N_DE_FRUTO <dbl> 19, 9, 21, 8, 4, 30, 22, 23, 17, 27, 29, 14, 16, 13, 25,…
## $ PESO <dbl> 101, 122, 127, 126, 37, 139, 140, 130, 138, 142, 121, 15…
## $ DIAM_ECUAT <dbl> 64.2, 64.2, 64.7, 64.9, 65.9, 66.4, 67.1, 67.5, 68.2, 68…
## $ NIVEL_DE_DAÑO <dbl> 1, 0, 3, 3, 2, 2, 3, 1, 2, 2, 2, 1, 1, 2, 1, 1, 0, 1, 0,…
## $ COLOR <dbl> 4, 5, 4, 1, 5, 4, 4, 3, 3, 4, 4, 1, 1, 3, 4, 1, 4, 1, 5,…
iris
## Sepal.Length Sepal.Width Petal.Length Petal.Width Species
## 1 5.1 3.5 1.4 0.2 setosa
## 2 4.9 3.0 1.4 0.2 setosa
## 3 4.7 3.2 1.3 0.2 setosa
## 4 4.6 3.1 1.5 0.2 setosa
## 5 5.0 3.6 1.4 0.2 setosa
## 6 5.4 3.9 1.7 0.4 setosa
## 7 4.6 3.4 1.4 0.3 setosa
## 8 5.0 3.4 1.5 0.2 setosa
## 9 4.4 2.9 1.4 0.2 setosa
## 10 4.9 3.1 1.5 0.1 setosa
## 11 5.4 3.7 1.5 0.2 setosa
## 12 4.8 3.4 1.6 0.2 setosa
## 13 4.8 3.0 1.4 0.1 setosa
## 14 4.3 3.0 1.1 0.1 setosa
## 15 5.8 4.0 1.2 0.2 setosa
## 16 5.7 4.4 1.5 0.4 setosa
## 17 5.4 3.9 1.3 0.4 setosa
## 18 5.1 3.5 1.4 0.3 setosa
## 19 5.7 3.8 1.7 0.3 setosa
## 20 5.1 3.8 1.5 0.3 setosa
## 21 5.4 3.4 1.7 0.2 setosa
## 22 5.1 3.7 1.5 0.4 setosa
## 23 4.6 3.6 1.0 0.2 setosa
## 24 5.1 3.3 1.7 0.5 setosa
## 25 4.8 3.4 1.9 0.2 setosa
## 26 5.0 3.0 1.6 0.2 setosa
## 27 5.0 3.4 1.6 0.4 setosa
## 28 5.2 3.5 1.5 0.2 setosa
## 29 5.2 3.4 1.4 0.2 setosa
## 30 4.7 3.2 1.6 0.2 setosa
## 31 4.8 3.1 1.6 0.2 setosa
## 32 5.4 3.4 1.5 0.4 setosa
## 33 5.2 4.1 1.5 0.1 setosa
## 34 5.5 4.2 1.4 0.2 setosa
## 35 4.9 3.1 1.5 0.2 setosa
## 36 5.0 3.2 1.2 0.2 setosa
## 37 5.5 3.5 1.3 0.2 setosa
## 38 4.9 3.6 1.4 0.1 setosa
## 39 4.4 3.0 1.3 0.2 setosa
## 40 5.1 3.4 1.5 0.2 setosa
## 41 5.0 3.5 1.3 0.3 setosa
## 42 4.5 2.3 1.3 0.3 setosa
## 43 4.4 3.2 1.3 0.2 setosa
## 44 5.0 3.5 1.6 0.6 setosa
## 45 5.1 3.8 1.9 0.4 setosa
## 46 4.8 3.0 1.4 0.3 setosa
## 47 5.1 3.8 1.6 0.2 setosa
## 48 4.6 3.2 1.4 0.2 setosa
## 49 5.3 3.7 1.5 0.2 setosa
## 50 5.0 3.3 1.4 0.2 setosa
## 51 7.0 3.2 4.7 1.4 versicolor
## 52 6.4 3.2 4.5 1.5 versicolor
## 53 6.9 3.1 4.9 1.5 versicolor
## 54 5.5 2.3 4.0 1.3 versicolor
## 55 6.5 2.8 4.6 1.5 versicolor
## 56 5.7 2.8 4.5 1.3 versicolor
## 57 6.3 3.3 4.7 1.6 versicolor
## 58 4.9 2.4 3.3 1.0 versicolor
## 59 6.6 2.9 4.6 1.3 versicolor
## 60 5.2 2.7 3.9 1.4 versicolor
## 61 5.0 2.0 3.5 1.0 versicolor
## 62 5.9 3.0 4.2 1.5 versicolor
## 63 6.0 2.2 4.0 1.0 versicolor
## 64 6.1 2.9 4.7 1.4 versicolor
## 65 5.6 2.9 3.6 1.3 versicolor
## 66 6.7 3.1 4.4 1.4 versicolor
## 67 5.6 3.0 4.5 1.5 versicolor
## 68 5.8 2.7 4.1 1.0 versicolor
## 69 6.2 2.2 4.5 1.5 versicolor
## 70 5.6 2.5 3.9 1.1 versicolor
## 71 5.9 3.2 4.8 1.8 versicolor
## 72 6.1 2.8 4.0 1.3 versicolor
## 73 6.3 2.5 4.9 1.5 versicolor
## 74 6.1 2.8 4.7 1.2 versicolor
## 75 6.4 2.9 4.3 1.3 versicolor
## 76 6.6 3.0 4.4 1.4 versicolor
## 77 6.8 2.8 4.8 1.4 versicolor
## 78 6.7 3.0 5.0 1.7 versicolor
## 79 6.0 2.9 4.5 1.5 versicolor
## 80 5.7 2.6 3.5 1.0 versicolor
## 81 5.5 2.4 3.8 1.1 versicolor
## 82 5.5 2.4 3.7 1.0 versicolor
## 83 5.8 2.7 3.9 1.2 versicolor
## 84 6.0 2.7 5.1 1.6 versicolor
## 85 5.4 3.0 4.5 1.5 versicolor
## 86 6.0 3.4 4.5 1.6 versicolor
## 87 6.7 3.1 4.7 1.5 versicolor
## 88 6.3 2.3 4.4 1.3 versicolor
## 89 5.6 3.0 4.1 1.3 versicolor
## 90 5.5 2.5 4.0 1.3 versicolor
## 91 5.5 2.6 4.4 1.2 versicolor
## 92 6.1 3.0 4.6 1.4 versicolor
## 93 5.8 2.6 4.0 1.2 versicolor
## 94 5.0 2.3 3.3 1.0 versicolor
## 95 5.6 2.7 4.2 1.3 versicolor
## 96 5.7 3.0 4.2 1.2 versicolor
## 97 5.7 2.9 4.2 1.3 versicolor
## 98 6.2 2.9 4.3 1.3 versicolor
## 99 5.1 2.5 3.0 1.1 versicolor
## 100 5.7 2.8 4.1 1.3 versicolor
## 101 6.3 3.3 6.0 2.5 virginica
## 102 5.8 2.7 5.1 1.9 virginica
## 103 7.1 3.0 5.9 2.1 virginica
## 104 6.3 2.9 5.6 1.8 virginica
## 105 6.5 3.0 5.8 2.2 virginica
## 106 7.6 3.0 6.6 2.1 virginica
## 107 4.9 2.5 4.5 1.7 virginica
## 108 7.3 2.9 6.3 1.8 virginica
## 109 6.7 2.5 5.8 1.8 virginica
## 110 7.2 3.6 6.1 2.5 virginica
## 111 6.5 3.2 5.1 2.0 virginica
## 112 6.4 2.7 5.3 1.9 virginica
## 113 6.8 3.0 5.5 2.1 virginica
## 114 5.7 2.5 5.0 2.0 virginica
## 115 5.8 2.8 5.1 2.4 virginica
## 116 6.4 3.2 5.3 2.3 virginica
## 117 6.5 3.0 5.5 1.8 virginica
## 118 7.7 3.8 6.7 2.2 virginica
## 119 7.7 2.6 6.9 2.3 virginica
## 120 6.0 2.2 5.0 1.5 virginica
## 121 6.9 3.2 5.7 2.3 virginica
## 122 5.6 2.8 4.9 2.0 virginica
## 123 7.7 2.8 6.7 2.0 virginica
## 124 6.3 2.7 4.9 1.8 virginica
## 125 6.7 3.3 5.7 2.1 virginica
## 126 7.2 3.2 6.0 1.8 virginica
## 127 6.2 2.8 4.8 1.8 virginica
## 128 6.1 3.0 4.9 1.8 virginica
## 129 6.4 2.8 5.6 2.1 virginica
## 130 7.2 3.0 5.8 1.6 virginica
## 131 7.4 2.8 6.1 1.9 virginica
## 132 7.9 3.8 6.4 2.0 virginica
## 133 6.4 2.8 5.6 2.2 virginica
## 134 6.3 2.8 5.1 1.5 virginica
## 135 6.1 2.6 5.6 1.4 virginica
## 136 7.7 3.0 6.1 2.3 virginica
## 137 6.3 3.4 5.6 2.4 virginica
## 138 6.4 3.1 5.5 1.8 virginica
## 139 6.0 3.0 4.8 1.8 virginica
## 140 6.9 3.1 5.4 2.1 virginica
## 141 6.7 3.1 5.6 2.4 virginica
## 142 6.9 3.1 5.1 2.3 virginica
## 143 5.8 2.7 5.1 1.9 virginica
## 144 6.8 3.2 5.9 2.3 virginica
## 145 6.7 3.3 5.7 2.5 virginica
## 146 6.7 3.0 5.2 2.3 virginica
## 147 6.3 2.5 5.0 1.9 virginica
## 148 6.5 3.0 5.2 2.0 virginica
## 149 6.2 3.4 5.4 2.3 virginica
## 150 5.9 3.0 5.1 1.8 virginica
IRIS <- iris %>%
rename(Longitud.Sepalo = Sepal.Length,
Ancho.Sepalo = Sepal.Width,
Longitud.Petalo = Petal.Length, Ancho.Petalo = Petal.Width,
ESPECIE = Species)
glimpse(IRIS)
## Rows: 150
## Columns: 5
## $ Longitud.Sepalo <dbl> 5.1, 4.9, 4.7, 4.6, 5.0, 5.4, 4.6, 5.0, 4.4, 4.9, 5.4,…
## $ Ancho.Sepalo <dbl> 3.5, 3.0, 3.2, 3.1, 3.6, 3.9, 3.4, 3.4, 2.9, 3.1, 3.7,…
## $ Longitud.Petalo <dbl> 1.4, 1.4, 1.3, 1.5, 1.4, 1.7, 1.4, 1.5, 1.4, 1.5, 1.5,…
## $ Ancho.Petalo <dbl> 0.2, 0.2, 0.2, 0.2, 0.2, 0.4, 0.3, 0.2, 0.2, 0.1, 0.2,…
## $ ESPECIE <fct> setosa, setosa, setosa, setosa, setosa, setosa, setosa…
ggplot(IRIS, aes(Longitud.Petalo, Ancho.Petalo)) +
geom_point()
ggplot(IRIS, aes(Longitud.Petalo, Ancho.Petalo)) +
geom_point(shape = 25, fill = "yellow") # Para las formas 21 a 25, `fill =` controla el color de relleno de la forma.
También es posible modificar el tamaño de la forma seleccionada con
“size =”
ggplot(IRIS, aes(Longitud.Petalo, Ancho.Petalo)) +
geom_point(size = 4)
ggplot(IRIS, aes(Longitud.Petalo, Ancho.Petalo)) +
geom_point(color = "red")
Combinamos atributos
ggplot(IRIS, aes(Longitud.Petalo, Ancho.Petalo, shape = ESPECIE, color = ESPECIE)) +
geom_point(size= 3)
DATOS DE PRECIPITACIONES
PP_77_22 <- read_excel("PP_77_22.xlsx")
glimpse(PP_77_22)
## Rows: 46
## Columns: 2
## $ ANIO <dbl> 1977, 1978, 1979, 1980, 1981, 1982, 1983, 1984, 1985, 1986, 1987,…
## $ PP <dbl> 666.4, 553.2, 675.7, 532.4, 528.7, 410.9, 569.2, 484.0, 610.2, 37…
ggplot(PP_77_22, aes(ANIO, PP)) +
geom_line()
Renombramos variables
PP_77_22 <- PP_77_22 %>%
rename(AÑO = ANIO,
PRECIPITACION = PP)
Visualizamos
PP_77_22
## # A tibble: 46 × 2
## AÑO PRECIPITACION
## <dbl> <dbl>
## 1 1977 666.
## 2 1978 553.
## 3 1979 676.
## 4 1980 532.
## 5 1981 529.
## 6 1982 411.
## 7 1983 569.
## 8 1984 484
## 9 1985 610.
## 10 1986 379.
## # ℹ 36 more rows
Combinamos ambos argumentos…
ggplot(PP_77_22, aes(AÑO, PRECIPITACION)) +
geom_line(color = "blue", linetype = 3, lwd = 1 )
ggplot(PP_77_22, aes(PRECIPITACION)) +
geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
Cambiamos color de los contenedores.
ggplot(PP_77_22, aes(PRECIPITACION)) +
geom_histogram(color = "yellow")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
Modificamos color y relleno de los contenedores.
ggplot(PP_77_22, aes(PRECIPITACION)) +
geom_histogram(color = "yellow", fill = "tomato")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
A continuación pueden ver los nombres de algunos colores con la
función colors()
colors()
## [1] "white" "aliceblue" "antiquewhite"
## [4] "antiquewhite1" "antiquewhite2" "antiquewhite3"
## [7] "antiquewhite4" "aquamarine" "aquamarine1"
## [10] "aquamarine2" "aquamarine3" "aquamarine4"
## [13] "azure" "azure1" "azure2"
## [16] "azure3" "azure4" "beige"
## [19] "bisque" "bisque1" "bisque2"
## [22] "bisque3" "bisque4" "black"
## [25] "blanchedalmond" "blue" "blue1"
## [28] "blue2" "blue3" "blue4"
## [31] "blueviolet" "brown" "brown1"
## [34] "brown2" "brown3" "brown4"
## [37] "burlywood" "burlywood1" "burlywood2"
## [40] "burlywood3" "burlywood4" "cadetblue"
## [43] "cadetblue1" "cadetblue2" "cadetblue3"
## [46] "cadetblue4" "chartreuse" "chartreuse1"
## [49] "chartreuse2" "chartreuse3" "chartreuse4"
## [52] "chocolate" "chocolate1" "chocolate2"
## [55] "chocolate3" "chocolate4" "coral"
## [58] "coral1" "coral2" "coral3"
## [61] "coral4" "cornflowerblue" "cornsilk"
## [64] "cornsilk1" "cornsilk2" "cornsilk3"
## [67] "cornsilk4" "cyan" "cyan1"
## [70] "cyan2" "cyan3" "cyan4"
## [73] "darkblue" "darkcyan" "darkgoldenrod"
## [76] "darkgoldenrod1" "darkgoldenrod2" "darkgoldenrod3"
## [79] "darkgoldenrod4" "darkgray" "darkgreen"
## [82] "darkgrey" "darkkhaki" "darkmagenta"
## [85] "darkolivegreen" "darkolivegreen1" "darkolivegreen2"
## [88] "darkolivegreen3" "darkolivegreen4" "darkorange"
## [91] "darkorange1" "darkorange2" "darkorange3"
## [94] "darkorange4" "darkorchid" "darkorchid1"
## [97] "darkorchid2" "darkorchid3" "darkorchid4"
## [100] "darkred" "darksalmon" "darkseagreen"
## [103] "darkseagreen1" "darkseagreen2" "darkseagreen3"
## [106] "darkseagreen4" "darkslateblue" "darkslategray"
## [109] "darkslategray1" "darkslategray2" "darkslategray3"
## [112] "darkslategray4" "darkslategrey" "darkturquoise"
## [115] "darkviolet" "deeppink" "deeppink1"
## [118] "deeppink2" "deeppink3" "deeppink4"
## [121] "deepskyblue" "deepskyblue1" "deepskyblue2"
## [124] "deepskyblue3" "deepskyblue4" "dimgray"
## [127] "dimgrey" "dodgerblue" "dodgerblue1"
## [130] "dodgerblue2" "dodgerblue3" "dodgerblue4"
## [133] "firebrick" "firebrick1" "firebrick2"
## [136] "firebrick3" "firebrick4" "floralwhite"
## [139] "forestgreen" "gainsboro" "ghostwhite"
## [142] "gold" "gold1" "gold2"
## [145] "gold3" "gold4" "goldenrod"
## [148] "goldenrod1" "goldenrod2" "goldenrod3"
## [151] "goldenrod4" "gray" "gray0"
## [154] "gray1" "gray2" "gray3"
## [157] "gray4" "gray5" "gray6"
## [160] "gray7" "gray8" "gray9"
## [163] "gray10" "gray11" "gray12"
## [166] "gray13" "gray14" "gray15"
## [169] "gray16" "gray17" "gray18"
## [172] "gray19" "gray20" "gray21"
## [175] "gray22" "gray23" "gray24"
## [178] "gray25" "gray26" "gray27"
## [181] "gray28" "gray29" "gray30"
## [184] "gray31" "gray32" "gray33"
## [187] "gray34" "gray35" "gray36"
## [190] "gray37" "gray38" "gray39"
## [193] "gray40" "gray41" "gray42"
## [196] "gray43" "gray44" "gray45"
## [199] "gray46" "gray47" "gray48"
## [202] "gray49" "gray50" "gray51"
## [205] "gray52" "gray53" "gray54"
## [208] "gray55" "gray56" "gray57"
## [211] "gray58" "gray59" "gray60"
## [214] "gray61" "gray62" "gray63"
## [217] "gray64" "gray65" "gray66"
## [220] "gray67" "gray68" "gray69"
## [223] "gray70" "gray71" "gray72"
## [226] "gray73" "gray74" "gray75"
## [229] "gray76" "gray77" "gray78"
## [232] "gray79" "gray80" "gray81"
## [235] "gray82" "gray83" "gray84"
## [238] "gray85" "gray86" "gray87"
## [241] "gray88" "gray89" "gray90"
## [244] "gray91" "gray92" "gray93"
## [247] "gray94" "gray95" "gray96"
## [250] "gray97" "gray98" "gray99"
## [253] "gray100" "green" "green1"
## [256] "green2" "green3" "green4"
## [259] "greenyellow" "grey" "grey0"
## [262] "grey1" "grey2" "grey3"
## [265] "grey4" "grey5" "grey6"
## [268] "grey7" "grey8" "grey9"
## [271] "grey10" "grey11" "grey12"
## [274] "grey13" "grey14" "grey15"
## [277] "grey16" "grey17" "grey18"
## [280] "grey19" "grey20" "grey21"
## [283] "grey22" "grey23" "grey24"
## [286] "grey25" "grey26" "grey27"
## [289] "grey28" "grey29" "grey30"
## [292] "grey31" "grey32" "grey33"
## [295] "grey34" "grey35" "grey36"
## [298] "grey37" "grey38" "grey39"
## [301] "grey40" "grey41" "grey42"
## [304] "grey43" "grey44" "grey45"
## [307] "grey46" "grey47" "grey48"
## [310] "grey49" "grey50" "grey51"
## [313] "grey52" "grey53" "grey54"
## [316] "grey55" "grey56" "grey57"
## [319] "grey58" "grey59" "grey60"
## [322] "grey61" "grey62" "grey63"
## [325] "grey64" "grey65" "grey66"
## [328] "grey67" "grey68" "grey69"
## [331] "grey70" "grey71" "grey72"
## [334] "grey73" "grey74" "grey75"
## [337] "grey76" "grey77" "grey78"
## [340] "grey79" "grey80" "grey81"
## [343] "grey82" "grey83" "grey84"
## [346] "grey85" "grey86" "grey87"
## [349] "grey88" "grey89" "grey90"
## [352] "grey91" "grey92" "grey93"
## [355] "grey94" "grey95" "grey96"
## [358] "grey97" "grey98" "grey99"
## [361] "grey100" "honeydew" "honeydew1"
## [364] "honeydew2" "honeydew3" "honeydew4"
## [367] "hotpink" "hotpink1" "hotpink2"
## [370] "hotpink3" "hotpink4" "indianred"
## [373] "indianred1" "indianred2" "indianred3"
## [376] "indianred4" "ivory" "ivory1"
## [379] "ivory2" "ivory3" "ivory4"
## [382] "khaki" "khaki1" "khaki2"
## [385] "khaki3" "khaki4" "lavender"
## [388] "lavenderblush" "lavenderblush1" "lavenderblush2"
## [391] "lavenderblush3" "lavenderblush4" "lawngreen"
## [394] "lemonchiffon" "lemonchiffon1" "lemonchiffon2"
## [397] "lemonchiffon3" "lemonchiffon4" "lightblue"
## [400] "lightblue1" "lightblue2" "lightblue3"
## [403] "lightblue4" "lightcoral" "lightcyan"
## [406] "lightcyan1" "lightcyan2" "lightcyan3"
## [409] "lightcyan4" "lightgoldenrod" "lightgoldenrod1"
## [412] "lightgoldenrod2" "lightgoldenrod3" "lightgoldenrod4"
## [415] "lightgoldenrodyellow" "lightgray" "lightgreen"
## [418] "lightgrey" "lightpink" "lightpink1"
## [421] "lightpink2" "lightpink3" "lightpink4"
## [424] "lightsalmon" "lightsalmon1" "lightsalmon2"
## [427] "lightsalmon3" "lightsalmon4" "lightseagreen"
## [430] "lightskyblue" "lightskyblue1" "lightskyblue2"
## [433] "lightskyblue3" "lightskyblue4" "lightslateblue"
## [436] "lightslategray" "lightslategrey" "lightsteelblue"
## [439] "lightsteelblue1" "lightsteelblue2" "lightsteelblue3"
## [442] "lightsteelblue4" "lightyellow" "lightyellow1"
## [445] "lightyellow2" "lightyellow3" "lightyellow4"
## [448] "limegreen" "linen" "magenta"
## [451] "magenta1" "magenta2" "magenta3"
## [454] "magenta4" "maroon" "maroon1"
## [457] "maroon2" "maroon3" "maroon4"
## [460] "mediumaquamarine" "mediumblue" "mediumorchid"
## [463] "mediumorchid1" "mediumorchid2" "mediumorchid3"
## [466] "mediumorchid4" "mediumpurple" "mediumpurple1"
## [469] "mediumpurple2" "mediumpurple3" "mediumpurple4"
## [472] "mediumseagreen" "mediumslateblue" "mediumspringgreen"
## [475] "mediumturquoise" "mediumvioletred" "midnightblue"
## [478] "mintcream" "mistyrose" "mistyrose1"
## [481] "mistyrose2" "mistyrose3" "mistyrose4"
## [484] "moccasin" "navajowhite" "navajowhite1"
## [487] "navajowhite2" "navajowhite3" "navajowhite4"
## [490] "navy" "navyblue" "oldlace"
## [493] "olivedrab" "olivedrab1" "olivedrab2"
## [496] "olivedrab3" "olivedrab4" "orange"
## [499] "orange1" "orange2" "orange3"
## [502] "orange4" "orangered" "orangered1"
## [505] "orangered2" "orangered3" "orangered4"
## [508] "orchid" "orchid1" "orchid2"
## [511] "orchid3" "orchid4" "palegoldenrod"
## [514] "palegreen" "palegreen1" "palegreen2"
## [517] "palegreen3" "palegreen4" "paleturquoise"
## [520] "paleturquoise1" "paleturquoise2" "paleturquoise3"
## [523] "paleturquoise4" "palevioletred" "palevioletred1"
## [526] "palevioletred2" "palevioletred3" "palevioletred4"
## [529] "papayawhip" "peachpuff" "peachpuff1"
## [532] "peachpuff2" "peachpuff3" "peachpuff4"
## [535] "peru" "pink" "pink1"
## [538] "pink2" "pink3" "pink4"
## [541] "plum" "plum1" "plum2"
## [544] "plum3" "plum4" "powderblue"
## [547] "purple" "purple1" "purple2"
## [550] "purple3" "purple4" "red"
## [553] "red1" "red2" "red3"
## [556] "red4" "rosybrown" "rosybrown1"
## [559] "rosybrown2" "rosybrown3" "rosybrown4"
## [562] "royalblue" "royalblue1" "royalblue2"
## [565] "royalblue3" "royalblue4" "saddlebrown"
## [568] "salmon" "salmon1" "salmon2"
## [571] "salmon3" "salmon4" "sandybrown"
## [574] "seagreen" "seagreen1" "seagreen2"
## [577] "seagreen3" "seagreen4" "seashell"
## [580] "seashell1" "seashell2" "seashell3"
## [583] "seashell4" "sienna" "sienna1"
## [586] "sienna2" "sienna3" "sienna4"
## [589] "skyblue" "skyblue1" "skyblue2"
## [592] "skyblue3" "skyblue4" "slateblue"
## [595] "slateblue1" "slateblue2" "slateblue3"
## [598] "slateblue4" "slategray" "slategray1"
## [601] "slategray2" "slategray3" "slategray4"
## [604] "slategrey" "snow" "snow1"
## [607] "snow2" "snow3" "snow4"
## [610] "springgreen" "springgreen1" "springgreen2"
## [613] "springgreen3" "springgreen4" "steelblue"
## [616] "steelblue1" "steelblue2" "steelblue3"
## [619] "steelblue4" "tan" "tan1"
## [622] "tan2" "tan3" "tan4"
## [625] "thistle" "thistle1" "thistle2"
## [628] "thistle3" "thistle4" "tomato"
## [631] "tomato1" "tomato2" "tomato3"
## [634] "tomato4" "turquoise" "turquoise1"
## [637] "turquoise2" "turquoise3" "turquoise4"
## [640] "violet" "violetred" "violetred1"
## [643] "violetred2" "violetred3" "violetred4"
## [646] "wheat" "wheat1" "wheat2"
## [649] "wheat3" "wheat4" "whitesmoke"
## [652] "yellow" "yellow1" "yellow2"
## [655] "yellow3" "yellow4" "yellowgreen"
bins. Usando este método especificamos el número de
contenedores.ggplot(PP_77_22, aes(PRECIPITACION)) +
geom_histogram(bins = 8, color = "gray", fill = "lightblue") +
theme_classic()
binwidth. Con el segundo método, en lugar de especificar el
número de bins, especificamos el ancho de los bins. Por ejemplo,
establezcamos el ancho de cada contenedor en cien milímetros.ggplot(PP_77_22, aes(PRECIPITACION)) +
geom_histogram(binwidth = 100, color = "red", fill = "blue") +
theme_classic()
#es limitado el poligono de frecuencia, por eso debo ponerlo con el histograma como en el chunk siguiente
ggplot(PP_77_22, aes(PRECIPITACION)) +
geom_freqpoly(binwidth = 100)
Combinamos un histograma con un polígono de frecuencias
ggplot(PP_77_22, aes(PRECIPITACION)) +
geom_histogram(binwidth = 100, color = "yellow") +
geom_freqpoly(binwidth = 100, color = "red", linewidth = 1.3)
MANDARINAS <- read_excel("MANDARINAS_2024.xlsx")
str(MANDARINAS)
## tibble [419 × 8] (S3: tbl_df/tbl/data.frame)
## $ N : num [1:419] 1 2 3 4 5 6 7 8 9 10 ...
## $ GRUPO : num [1:419] 1 1 1 1 1 1 1 1 1 1 ...
## $ VARIEDAD : chr [1:419] "Clementina" "Clementina" "Clementina" "Clementina" ...
## $ N_DE_FRUTO : num [1:419] 19 9 21 8 4 30 22 23 17 27 ...
## $ PESO : num [1:419] 101 122 127 126 37 139 140 130 138 142 ...
## $ DIAM_ECUAT : num [1:419] 64.2 64.2 64.7 64.9 65.9 66.4 67.1 67.5 68.2 68.2 ...
## $ NIVEL_DE_DAÑO: num [1:419] 1 0 3 3 2 2 3 1 2 2 ...
## $ COLOR : num [1:419] 4 5 4 1 5 4 4 3 3 4 ...
#grafico del diametro ecuatorial en funcion de las variedades #los outlayers son valores que superan 1.5 veces los valores del rango intercuartilico
ggplot(MANDARINAS, aes(DIAM_ECUAT, VARIEDAD)) +
geom_boxplot()
ggplot(MANDARINAS, aes(DIAM_ECUAT, VARIEDAD, color = VARIEDAD)) +
geom_boxplot()
¿Y si agregamos la media muestral?
ggplot(MANDARINAS, aes(DIAM_ECUAT, VARIEDAD, color = VARIEDAD)) +
geom_boxplot() +
stat_summary(fun = mean, color = "black") # función para agregar la media muestral y asignarle color
## Warning: Removed 2 rows containing missing values or values outside the scale range
## (`geom_segment()`).