Cargue base de datos

library(readxl)
## Warning: package 'readxl' was built under R version 4.4.3
library(forcats)
library(dplyr)
## 
## Adjuntando el paquete: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
BASE_AUTOTOMA <- read_excel("BD_proyecto autotoma_19.01.26.xlsx") #532


BASE_AUTOTOMA_filt <- BASE_AUTOTOMA %>% filter(resultado_vph == 1)
BASE_AUTOTOMA_filt[BASE_AUTOTOMA_filt$ult_tamizaje_agr == 0,] <- NA

BASE_AUTOTOMA_filt <- BASE_AUTOTOMA_filt %>% 
    mutate(
      metodo_int_treat_cat = factor(
      metodo_int_treat,
      levels = c(1,0),
      labels = c("Self-collected", "Clinician")
    )
  ) %>% 
  mutate(
    departamento_cat = factor(
      departamento,
      levels = c(1,2),
      labels = c("Putumayo", "Choco")
    )
  ) %>% 
  mutate(
    etnia_cat = factor(
      etnia_agr,
      levels = c(1,2,3),
      labels = c("Indigena", "Afrocolombiano", "Otro")
    )
  ) %>% 
  mutate(
    estrategia_toma_cat = factor(
      estrategia_toma,
      levels = c(1,2),
      labels = c("Campaña", "Tamizaje rutinario")
    )
  ) %>% 
  mutate(
    regimen_agr_cat = factor(
      regimen_agr,
      levels = c(0, 1,2),
      labels = c("No afiliado/NA", "Contributivo/otro", "Subsidiado")
    )
  ) %>% 
mutate(
  ult_tamizaje_agr_cat = factor(
    ult_tamizaje_agr,
    levels = c(1,2, 3),
    labels = c("<= 24 meses", "25-36 meses", ">36 meses")
  )
) %>% 
  mutate(
    area_residencia_cat = factor(
      area_residencia,
      levels = c(1,2),
      labels = c("Urbano", "Rural")
    )
  ) %>% 
   mutate(
   lugar_de_residencia_cat = case_when(
      lugar_de_residencia == 1 ~ "Distante",
      lugar_de_residencia == 2 ~ "Distante",
      lugar_de_residencia == 3 ~ "No_D",
      lugar_de_residencia == 4 ~ "No_D",
      TRUE ~ NA_character_
    )
  ) %>% 
  mutate(ngestaciones_cat = cut(n_gestaciones, 
                           breaks = c (-Inf,3,Inf), 
                           right = T, 
                           labels = c("<=3", ">3"))) %>% 
  mutate(
    aistio_trat_cat = factor(
      asistio_tratamiento,
      levels = c(1,0),
      labels = c("Si", "No"))) %>% 
  
  mutate(
    asiste_seguimiento_cat = factor(
      asiste_seguimiento,
      levels = c(1,0),
      labels = c("Si", "No")))

ORs Tratamiento

Departamento

Putumayo

## Warning: package 'summarytools' was built under R version 4.4.3
metodo_int_treat_cat
aistio_trat_cat Self-
collected
Clinician Total
Si 54 ( 71.1% ) 22 ( 28.9% ) 76 ( 100.0% )
No 8 ( 100.0% ) 0 ( 0.0% ) 8 ( 100.0% )
Total 62 ( 73.8% ) 22 ( 26.2% ) 84 ( 100.0% )
O.R. (95% C.I.) = 0.00  (0.00 - NaN)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Choco

R2<-ctable(x = BASE_Choco$aistio_trat_cat,
           y = BASE_Choco$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)
print(R2, method = "render")
metodo_int_treat_cat
aistio_trat_cat Self-
collected
Clinician Total
Si 31 ( 72.1% ) 12 ( 27.9% ) 43 ( 100.0% )
No 4 ( 66.7% ) 2 ( 33.3% ) 6 ( 100.0% )
Total 35 ( 71.4% ) 14 ( 28.6% ) 49 ( 100.0% )
O.R. (95% C.I.) = 1.29  (0.21 - 8.00)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Estrategia

Campaña

BASE_Campana <- BASE_AUTOTOMA_clean %>% filter(estrategia_toma_cat == "Campaña")
BASE_Tamizaje <- BASE_AUTOTOMA_clean %>% filter(estrategia_toma_cat== "Tamizaje rutinario")

R3<-ctable(x = BASE_Campana$aistio_trat_cat,
           y = BASE_Campana$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R3, method = "render")
metodo_int_treat_cat
aistio_trat_cat Self-
collected
Clinician Total
Si 53 ( 61.6% ) 33 ( 38.4% ) 86 ( 100.0% )
No 9 ( 81.8% ) 2 ( 18.2% ) 11 ( 100.0% )
Total 62 ( 63.9% ) 35 ( 36.1% ) 97 ( 100.0% )
O.R. (95% C.I.) = 0.36  (0.073 - 1.75)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Tamizaje

R4<-ctable(x = BASE_Tamizaje$aistio_trat_cat,
           y = BASE_Tamizaje$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R4, method = "render")
metodo_int_treat_cat
aistio_trat_cat Self-
collected
Clinician Total
Si 32 ( 97.0% ) 1 ( 3.0% ) 33 ( 100.0% )
No 3 ( 100.0% ) 0 ( 0.0% ) 3 ( 100.0% )
Total 35 ( 97.2% ) 1 ( 2.8% ) 36 ( 100.0% )
O.R. (95% C.I.) = 0.00  (0.00 - NaN)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Municipio

Distante

BASE_Distante <- BASE_AUTOTOMA_clean %>% filter(lugar_de_residencia_cat == "Distante")
BASE_Ndistante <- BASE_AUTOTOMA_clean %>% filter(lugar_de_residencia_cat== "No_D")

R5<-ctable(x = BASE_Distante$aistio_trat_cat,
           y = BASE_Distante$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R5, method = "render")
metodo_int_treat_cat
aistio_trat_cat Self-
collected
Clinician Total
Si 28 ( 68.3% ) 13 ( 31.7% ) 41 ( 100.0% )
No 7 ( 87.5% ) 1 ( 12.5% ) 8 ( 100.0% )
Total 35 ( 71.4% ) 14 ( 28.6% ) 49 ( 100.0% )
O.R. (95% C.I.) = 0.31  (0.034 - 2.77)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

No distante

R6<-ctable(x = BASE_Ndistante$aistio_trat_cat,
           y = BASE_Ndistante$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R6, method = "render")
metodo_int_treat_cat
aistio_trat_cat Self-
collected
Clinician Total
Si 57 ( 73.1% ) 21 ( 26.9% ) 78 ( 100.0% )
No 5 ( 83.3% ) 1 ( 16.7% ) 6 ( 100.0% )
Total 62 ( 73.8% ) 22 ( 26.2% ) 84 ( 100.0% )
O.R. (95% C.I.) = 0.54  (0.06 - 4.92)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

ORs Asistencia al seguimiento

Departamento

Putumayo

R7<-ctable(x = BASE_Putumayo$asiste_seguimiento_cat,
           y = BASE_Putumayo$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R7, method = "render")
metodo_int_treat_cat
asiste_seguimiento_cat Self-
collected
Clinician Total
Si 42 ( 71.2% ) 17 ( 28.8% ) 59 ( 100.0% )
No 20 ( 80.0% ) 5 ( 20.0% ) 25 ( 100.0% )
Total 62 ( 73.8% ) 22 ( 26.2% ) 84 ( 100.0% )
O.R. (95% C.I.) = 0.62  (0.20 - 1.91)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Choco

R8<-ctable(x = BASE_Choco$asiste_seguimiento_cat,
           y = BASE_Choco$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R8, method = "render")
metodo_int_treat_cat
asiste_seguimiento_cat Self-
collected
Clinician Total
Si 28 ( 77.8% ) 8 ( 22.2% ) 36 ( 100.0% )
No 7 ( 53.8% ) 6 ( 46.2% ) 13 ( 100.0% )
Total 35 ( 71.4% ) 14 ( 28.6% ) 49 ( 100.0% )
O.R. (95% C.I.) = 3.00  (0.78 - 11.50)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Estrategia

Campaña

R9<-ctable(x = BASE_Campana$asiste_seguimiento_cat,
           y = BASE_Campana$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R9, method = "render")
metodo_int_treat_cat
asiste_seguimiento_cat Self-
collected
Clinician Total
Si 48 ( 66.7% ) 24 ( 33.3% ) 72 ( 100.0% )
No 14 ( 56.0% ) 11 ( 44.0% ) 25 ( 100.0% )
Total 62 ( 63.9% ) 35 ( 36.1% ) 97 ( 100.0% )
O.R. (95% C.I.) = 1.57  (0.62 - 3.98)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Tamizaje

R10<-ctable(x = BASE_Tamizaje$asiste_seguimiento_cat,
           y = BASE_Tamizaje$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R10, method = "render")
metodo_int_treat_cat
asiste_seguimiento_cat Self-
collected
Clinician Total
Si 22 ( 95.7% ) 1 ( 4.3% ) 23 ( 100.0% )
No 13 ( 100.0% ) 0 ( 0.0% ) 13 ( 100.0% )
Total 35 ( 97.2% ) 1 ( 2.8% ) 36 ( 100.0% )
O.R. (95% C.I.) = 0.00  (0.00 - NaN)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Distancia municipio

Distante

R11<-ctable(x = BASE_Distante$asiste_seguimiento_cat,
           y = BASE_Distante$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R11, method = "render")
metodo_int_treat_cat
asiste_seguimiento_cat Self-
collected
Clinician Total
Si 28 ( 75.7% ) 9 ( 24.3% ) 37 ( 100.0% )
No 7 ( 58.3% ) 5 ( 41.7% ) 12 ( 100.0% )
Total 35 ( 71.4% ) 14 ( 28.6% ) 49 ( 100.0% )
O.R. (95% C.I.) = 2.22  (0.56 - 8.76)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

No distante

R12<-ctable(x = BASE_Ndistante$asiste_seguimiento_cat,
           y = BASE_Ndistante$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R12, method = "render")
metodo_int_treat_cat
asiste_seguimiento_cat Self-
collected
Clinician Total
Si 42 ( 72.4% ) 16 ( 27.6% ) 58 ( 100.0% )
No 20 ( 76.9% ) 6 ( 23.1% ) 26 ( 100.0% )
Total 62 ( 73.8% ) 22 ( 26.2% ) 84 ( 100.0% )
O.R. (95% C.I.) = 0.79  (0.27 - 2.32)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Asistencia tamización

BASE_AUTOTOMA_cor<- read_xlsx("BD_proyecto autotoma_26ene26.xlsx")
## Warning: Expecting logical in CC1022 / R1022C81: got 'Lesión extensa'
## Warning: Expecting logical in CC1152 / R1152C81: got 'Lesión extensa'
## Warning: Expecting logical in CC1155 / R1155C81: got 'VPH 16, tratada hace 6
## meses. Solicito colposcopia biopsia'
BASE_AUTOTOMA_cor_filt <- BASE_AUTOTOMA_cor


BASE_AUTOTOMA_cor_filt <- BASE_AUTOTOMA_cor_filt %>% 
    mutate(
      metodo_int_treat_cat = factor(
      metodo_int_treat,
      levels = c(1,0),
      labels = c("Self-collected", "Clinician")
    )
  ) %>% 
  mutate(
    departamento_cat = factor(
      departamento,
      levels = c(1,2),
      labels = c("Putumayo", "Choco")
    )
  ) %>% 
  mutate(
    etnia_cat = factor(
      etnia_agr,
      levels = c(1,2,3),
      labels = c("Indigena", "Afrocolombiano", "Otro")
    )
  ) %>% 
  mutate(
    estrategia_toma_cat = factor(
      estrategia_toma,
      levels = c(1,2),
      labels = c("Campaña", "Tamizaje rutinario")
    )
  ) %>% 
  mutate(
    regimen_agr_cat = factor(
      regimen_agr,
      levels = c(0, 1,2),
      labels = c("No afiliado/NA", "Contributivo/otro", "Subsidiado")
    )
  ) %>% 
mutate(
  ult_tamizaje_agr_cat = factor(
    ult_tamizaje_agr,
    levels = c(1,2, 3),
    labels = c("<= 24 meses", "25-36 meses", ">36 meses")
  )
) %>% 
  mutate(
    area_residencia_cat = factor(
      area_residencia,
      levels = c(1,2),
      labels = c("Urbano", "Rural")
    )
  ) %>% 
   mutate(
   lugar_de_residencia_cat = case_when(
      lugar_de_residencia == 1 ~ "Distante",
      lugar_de_residencia == 2 ~ "Distante",
      lugar_de_residencia == 3 ~ "No_D",
      lugar_de_residencia == 4 ~ "No_D",
      TRUE ~ NA_character_
    )
  ) %>% 
  mutate(ngestaciones_cat = cut(n_gestaciones, 
                           breaks = c (-Inf,3,Inf), 
                           right = T, 
                           labels = c("<=3", ">3"))) %>% 
  mutate(
    asistio_tamizaje_cat = factor(
      asistio_tamizaje,
      levels = c(1,0),
      labels = c("Si", "No")))

OR

Departamento

Putumayo

BASE_AUTOTOMA_cor_clean <- BASE_AUTOTOMA_cor_filt %>%
  filter(!is.na(metodo_int_treat_cat) & 
         !is.na(departamento_cat) & 
         !is.na(asistio_tamizaje))

BASE_Putumayo2 <- BASE_AUTOTOMA_cor_clean %>% filter(departamento_cat == "Putumayo")
BASE_Choco2 <- BASE_AUTOTOMA_cor_clean %>% filter(departamento_cat== "Choco")


R13<-ctable(x = BASE_Putumayo2$asistio_tamizaje_cat,
           y = BASE_Putumayo2$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R13, method = "render")
metodo_int_treat_cat
asistio_tamizaje_cat Self-
collected
Clinician Total
Si 235 ( 67.7% ) 112 ( 32.3% ) 347 ( 100.0% )
No 125 ( 35.4% ) 228 ( 64.6% ) 353 ( 100.0% )
Total 360 ( 51.4% ) 340 ( 48.6% ) 700 ( 100.0% )
O.R. (95% C.I.) = 3.83  (2.80 - 5.24)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Choco

R14<-ctable(x = BASE_Choco2$asistio_tamizaje_cat,
           y = BASE_Choco2$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R14, method = "render")
metodo_int_treat_cat
asistio_tamizaje_cat Self-
collected
Clinician Total
Si 122 ( 65.9% ) 63 ( 34.1% ) 185 ( 100.0% )
No 238 ( 46.2% ) 277 ( 53.8% ) 515 ( 100.0% )
Total 360 ( 51.4% ) 340 ( 48.6% ) 700 ( 100.0% )
O.R. (95% C.I.) = 2.25  (1.59 - 3.20)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Estrategia

Campaña

BASE_Campana2 <- BASE_AUTOTOMA_cor_clean %>% filter(estrategia_toma_cat == "Campaña")
BASE_Tamizaje2 <- BASE_AUTOTOMA_cor_clean %>% filter(estrategia_toma_cat== "Tamizaje rutinario")

R15<-ctable(x = BASE_Campana2$asistio_tamizaje_cat,
           y = BASE_Campana2$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R15, method = "render")
metodo_int_treat_cat
asistio_tamizaje_cat Self-
collected
Clinician Total
Si 239 ( 62.1% ) 146 ( 37.9% ) 385 ( 100.0% )
No 121 ( 38.4% ) 194 ( 61.6% ) 315 ( 100.0% )
Total 360 ( 51.4% ) 340 ( 48.6% ) 700 ( 100.0% )
O.R. (95% C.I.) = 2.62  (1.93 - 3.57)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Tamizaje

R16<-ctable(x = BASE_Tamizaje2$asistio_tamizaje_cat,
           y = BASE_Tamizaje2$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R16, method = "render")
metodo_int_treat_cat
asistio_tamizaje_cat Self-
collected
Clinician Total
Si 118 ( 80.3% ) 29 ( 19.7% ) 147 ( 100.0% )
No 242 ( 43.8% ) 311 ( 56.2% ) 553 ( 100.0% )
Total 360 ( 51.4% ) 340 ( 48.6% ) 700 ( 100.0% )
O.R. (95% C.I.) = 5.23  (3.37 - 8.12)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Distancia municipio

Munucipio distante

BASE_Distante2 <- BASE_AUTOTOMA_cor_clean %>% filter(lugar_de_residencia_cat == "Distante")
BASE_Ndistante2 <- BASE_AUTOTOMA_cor_clean %>% filter(lugar_de_residencia_cat== "No_D")

R17<-ctable(x = BASE_Distante2$asistio_tamizaje_cat,
           y = BASE_Distante2$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R17, method = "render")
metodo_int_treat_cat
asistio_tamizaje_cat Self-
collected
Clinician Total
Si 131 ( 67.2% ) 64 ( 32.8% ) 195 ( 100.0% )
No 229 ( 45.3% ) 276 ( 54.7% ) 505 ( 100.0% )
Total 360 ( 51.4% ) 340 ( 48.6% ) 700 ( 100.0% )
O.R. (95% C.I.) = 2.47  (1.74 - 3.49)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

No distante

R18<-ctable(x = BASE_Ndistante2$asistio_tamizaje_cat,
           y = BASE_Ndistante2$metodo_int_treat_cat,
       prop = "r",      # Proporciones por fila ("c" para columna, "t" para total)
       chisq = F,   
       OR = TRUE,       # Odds Ratio
       headings = FALSE)


print(R18, method = "render")
metodo_int_treat_cat
asistio_tamizaje_cat Self-
collected
Clinician Total
Si 226 ( 67.1% ) 111 ( 32.9% ) 337 ( 100.0% )
No 134 ( 36.9% ) 229 ( 63.1% ) 363 ( 100.0% )
Total 360 ( 51.4% ) 340 ( 48.6% ) 700 ( 100.0% )
O.R. (95% C.I.) = 3.48  (2.55 - 4.75)

Generated by summarytools 1.1.4 (R version 4.4.2)
2026-01-30

Exportar a Excel

library(openxlsx)

wb <- createWorkbook()

# Agregar cada tabla en una hoja diferente
addWorksheet(wb, "OR_AT_Putumayo")
writeData(wb, "OR_AT_Putumayo", as.data.frame(R1))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AT_Choco")
writeData(wb, "OR_AT_Choco", as.data.frame(R2))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AT_Campana")
writeData(wb, "OR_AT_Campana", as.data.frame(R3))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AT_Tamizaje")
writeData(wb, "OR_AT_Tamizaje", as.data.frame(R4))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AT_Distante")
writeData(wb, "OR_AT_Distante", as.data.frame(R5))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AT_Nodistnate")
writeData(wb, "OR_AT_Nodistnate", as.data.frame(R6))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AS_Putumayo")
writeData(wb, "OR_AS_Putumayo", as.data.frame(R7))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AS_Choco")
writeData(wb, "OR_AS_Choco", as.data.frame(R8))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AS_Campana")
writeData(wb, "OR_AS_Campana", as.data.frame(R9))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AS_Tamizaje")
writeData(wb, "OR_AS_Tamizaje", as.data.frame(R10))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AS_Distante")
writeData(wb, "OR_AS_Distante", as.data.frame(R11))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_AS_Nodistnate")
writeData(wb, "OR_AS_Nodistnate", as.data.frame(R12))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_ATa_Putumayo")
writeData(wb, "OR_ATa_Putumayo", as.data.frame(R13))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_ATa_Choco")
writeData(wb, "OR_ATa_Choco", as.data.frame(R14))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_ATa_Campana")
writeData(wb, "OR_ATa_Campana", as.data.frame(R15))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_ATa_Tamizaje")
writeData(wb, "OR_ATa_Tamizaje", as.data.frame(R16))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_ATa_Distante")
writeData(wb, "OR_ATa_Distante", as.data.frame(R17))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
addWorksheet(wb, "OR_ATa_Nodistnate")
writeData(wb, "OR_ATa_Nodistnate", as.data.frame(R18))
## Warning in (function (..., row.names = NULL, check.rows = FALSE, check.names =
## TRUE, : los nombres de fila se encontraron a partir de una variable corta y se
## descartaron
saveWorkbook(wb, "Tablas_Ors.xlsx", overwrite = TRUE)