library(crosstable)
library(tidyverse)

crosstable(base_opinion, cols= c(SEXO, EDAD_REC, NIV_EDUC_REC), by= ZONA, total = "both", label = TRUE) %>% as_flextable()
library(crosstable)
library(tidyverse)

obj<- crosstable(base_opinion, cols= c(SEXO, EDAD_REC, NIV_EDUC_REC), by= c(ZONA), total = "both", label = TRUE) %>% as_flextable()