CEOdata is a package that facilitates the incorporation of microdata (individual responses) of public opinion polls in Catalonia into R
, as performed by the “Centre d’Estudis d’Opinió” (CEO, Opinion Studies Center). It has basically three main functions with a separate purpose:
CEOdata()
: that provides the data of the surveys directly into R
.CEOmeta()
: that allows the user to inspect the details of the available surveys (metadata) and to search for specific topics and get the survey details.CEOsearch()
: that allows the user to search for variables, variable labels and value labels within a survey data gathered using the CEOdata()
function.CEOdata()
: Get the survey dataThe most comprehensive kind of data on Catalan public opinion is the “Barometer”, that can be retrieved by default by the main function CEOdata()
.
library(CEOdata)
CEOdata() d <-
This provides a cleaned and merged version of all the available Barometers, since 2017, providing easy access to the following number of responses and variables:
dim(d)
## [1] 35838 897
d
## # A tibble: 35,838 × 897
## PONDERA ORDRECINE ORDRE_REVISADA REO METODOLOGIA BOP_NUM ANY MES DIA
## <dbl> <dbl> <dbl> <dbl> <fct> <fct> <dbl> <dbl> <dbl>
## 1 1.86 1 NA 746 <NA> Març 14… 2014 3 27
## 2 1.86 2 NA 746 <NA> Març 14… 2014 3 5
## 3 1.86 3 NA 746 <NA> Març 14… 2014 3 11
## 4 1.86 4 NA 746 <NA> Març 14… 2014 3 11
## 5 1.86 5 NA 746 <NA> Març 14… 2014 3 27
## 6 1.86 6 NA 746 <NA> Març 14… 2014 3 28
## 7 1.86 7 NA 746 <NA> Març 14… 2014 3 3
## 8 1.86 8 NA 746 <NA> Març 14… 2014 3 25
## 9 1.86 9 NA 746 <NA> Març 14… 2014 3 7
## 10 1.86 10 NA 746 <NA> Març 14… 2014 3 27
## # … with 35,828 more rows, and 888 more variables: HORA_INI <time>,
## # HORA_FIN <time>, DATA_INI <date>, DATA_FIN <date>, DURADA <dbl>,
## # FASE <fct>, ENQUESTADOR_CODI <dbl>, ENQUESTADOR_SEXE <fct>,
## # ENQUESTADOR_EDAT <dbl>, ENQUESTADOR_ESTUDIS <fct>,
## # ENQUESTADOR_NACIONALITAT <fct>, NUM_QUEST_CAMP <dbl>, PROVINCIA <fct>,
## # HABITAT <fct>, MUNICIPI <fct>, COMARCA <fct>, CLUSTER <dbl>, ID_RUTA <dbl>,
## # SECCIO_TEORICA <dbl>, CONF_SECC <fct>, SECCIO_REAL <dbl>, …
names(d)[1:50]
## [1] "PONDERA" "ORDRECINE"
## [3] "ORDRE_REVISADA" "REO"
## [5] "METODOLOGIA" "BOP_NUM"
## [7] "ANY" "MES"
## [9] "DIA" "HORA_INI"
## [11] "HORA_FIN" "DATA_INI"
## [13] "DATA_FIN" "DURADA"
## [15] "FASE" "ENQUESTADOR_CODI"
## [17] "ENQUESTADOR_SEXE" "ENQUESTADOR_EDAT"
## [19] "ENQUESTADOR_ESTUDIS" "ENQUESTADOR_NACIONALITAT"
## [21] "NUM_QUEST_CAMP" "PROVINCIA"
## [23] "HABITAT" "MUNICIPI"
## [25] "COMARCA" "CLUSTER"
## [27] "ID_RUTA" "SECCIO_TEORICA"
## [29] "CONF_SECC" "SECCIO_REAL"
## [31] "DOMICILI_PARTICULAR" "LLENGUA_ENQUESTA"
## [33] "PADRO" "RESIDENCIA"
## [35] "LLENGUA_SISTEMA" "CIUTADANIA"
## [37] "GENERE" "GENERE_LITERALS"
## [39] "SEXE" "EDAT"
## [41] "EDAT_GR" "EDAT_CEO"
## [43] "LLOC_NAIX" "HORA_PRIMERA_PREGUNTA"
## [45] "GRAVACIO" "TIPUS_GRAV"
## [47] "PRE_PROBLEMES" "PROBLEMES_LITERALS"
## [49] "PROBLEMES_R_1" "PROBLEMES_R_2"
CEOdata()
allows you to select specific Barometers, by providing their internal register in the reo
argument. The reo is the internal name that the CEO uses, and stands for “Registre d’Estudis d’Opinió” (register of opinion studies), and is the main identifier of the survey, also present in the table of meta data. Although many of them are numbers, some have a number, a slash and another number, and therefore a character vector must be passed. Only a single REO can be passed, as it is not guaranteed that different data matrices share any column, and may refer to very different topics.
For instance, to get only the data of the study with register “746” (corresponding to March 2013):
CEOdata(reo = "746") d746 <-
## Converting the original data into R. This may take a while.
d746
## # A tibble: 2,000 × 475
## NUM NUM_CINE BOP_NUM MES ANY DIA CODI_ENQ HOR_INI HOR_FIN DURADA
## <dbl> <dbl> <dbl+lbl> <dbl> <dbl> <dbl> <dbl+lb> <time> <time> <dbl>
## 1 NA 1 32 [Març. 1… 4 14 NA 243 [G3] NA NA 1203
## 2 NA 2 32 [Març. 1… 4 14 NA 254 [T4] NA NA 997
## 3 NA 3 32 [Març. 1… 4 14 NA 243 [G3] NA NA 1127
## 4 NA 4 32 [Març. 1… 4 14 NA 235 [B5] NA NA 1792
## 5 NA 5 32 [Març. 1… 4 14 NA 236 [B6] NA NA 1418
## 6 NA 6 32 [Març. 1… 3 14 NA 246 [L1] NA NA 1964
## 7 NA 7 32 [Març. 1… 4 14 NA 244 [G4] NA NA 2283
## 8 NA 8 32 [Març. 1… 4 14 NA 233 [B3] NA NA 1322
## 9 NA 9 32 [Març. 1… 3 14 NA 232 [B2] NA NA 1778
## 10 NA 10 32 [Març. 1… 3 14 NA 254 [T4] NA NA 1119
## # … with 1,990 more rows, and 465 more variables: num_quest <dbl>,
## # sexe_enq <dbl+lbl>, edat_enq <dbl>, estudis_enq <dbl+lbl>,
## # nacionalitat_enq <dbl+lbl>, PROVI <dbl+lbl>, HABITAT <dbl+lbl>,
## # MUN <dbl+lbl>, ADRECA <chr>, COMARCA <dbl+lbl>, SEXE <dbl+lbl>, EDAT <dbl>,
## # SE <chr>, GR_EDAT <dbl+lbl>, Edat_CEO <dbl+lbl>, F01 <dbl+lbl>,
## # F02 <dbl+lbl>, F03 <dbl+lbl>, F04 <dbl+lbl>, PRE_P1 <dbl+lbl>,
## # P1_LITERALS <chr>, P1_100_R <dbl>, P1_200_R <dbl>, P1_300_R <dbl>, …
Not all studies carried on by the CEO (and therefore listed in the CEOmeta()
function –see below–) have microdata available. For convenience, there is a variable in the metadata that returns whether the microdata is available or not (microdata_available
).
When using the kind
argument (which is the default), the function CEOdata()
also allows to restrict the whole set of barometers based on specific time frames defined by a date with the arguments date_start
and date_end
using the YYYY-MM-DD format. Notice that only the barometers are considered when using this arguments, not other studies.
CEOdata(date_start = "2019-01-01", date_end = "2019-12-31") b2019 <-
## Downloading the barometer.
## Converting the original data into R. This may take a while.
## Post-processing the data. This may take a while.
b2019
## # A tibble: 4,500 × 897
## PONDERA ORDRECINE ORDRE_REVISADA REO METODOLOGIA BOP_NUM ANY MES DIA
## <dbl> <dbl> <dbl> <dbl> <fct> <fct> <dbl> <dbl> <dbl>
## 1 1 23339 NA 919 <NA> Març 19… 2019 3 4
## 2 1 23340 NA 919 <NA> Març 19… 2019 3 4
## 3 1 23341 NA 919 <NA> Març 19… 2019 3 4
## 4 1 23342 NA 919 <NA> Març 19… 2019 3 4
## 5 1 23343 NA 919 <NA> Març 19… 2019 3 4
## 6 1 23344 NA 919 <NA> Març 19… 2019 3 4
## 7 1 23345 NA 919 <NA> Març 19… 2019 3 4
## 8 1 23346 NA 919 <NA> Març 19… 2019 3 4
## 9 1 23347 NA 919 <NA> Març 19… 2019 3 4
## 10 1 23348 NA 919 <NA> Març 19… 2019 3 4
## # … with 4,490 more rows, and 888 more variables: HORA_INI <time>,
## # HORA_FIN <time>, DATA_INI <date>, DATA_FIN <date>, DURADA <dbl>,
## # FASE <fct>, ENQUESTADOR_CODI <dbl>, ENQUESTADOR_SEXE <fct>,
## # ENQUESTADOR_EDAT <dbl>, ENQUESTADOR_ESTUDIS <fct>,
## # ENQUESTADOR_NACIONALITAT <fct>, NUM_QUEST_CAMP <dbl>, PROVINCIA <fct>,
## # HABITAT <fct>, MUNICIPI <fct>, COMARCA <fct>, CLUSTER <dbl>, ID_RUTA <dbl>,
## # SECCIO_TEORICA <dbl>, CONF_SECC <fct>, SECCIO_REAL <dbl>, …
By default CEOdata()
incorporates new variables to the original matrix. Variables that are created for convenience, such as the date of the survey. The CEO data not always provides a day of the month. In that case, 28 is used. These variables appear at the end of the dataset and can be distinguished from the original CEO variables because only the first letter is capitalized.
tail(names(d))
## [1] "CIRCUIT_1019_2" "CIRCUIT_1019_3" "CIRCUIT_1019_4" "CIRCUIT_1019_5"
## [5] "CIRCUIT_1019_6" "Data"
In case of desiring all variable names to be lowercase, one can simply convert them with tolower()
:
d
d.lowercase <-names(d.lowercase) <- tolower(names(d.lowercase))
CEOmeta()
: Access to the metadata of studies and surveysThe function CEOmeta
allows to easily retrieve, search and restrict by time the list of all the surveys produced by the CEO, which amounts to more than a thousand as of early 2022.
When called alone, the function downloads the latest version of the metadata published by the center, in a transparent way, and caching its content so that any subsequent calls in the same R
session do not need to download it again.
CEOmeta()
## # A tibble: 1,133 × 28
## REO `Titol enquesta` `Titol estudi` `Metodologia e…` `Metode de rec…`
## <fct> <chr> <chr> <fct> <fct>
## 1 1019 Baròmetre d'Opinió Po… Baròmetre d'O… quantitativa presencial
## 2 1018 Enquesta de Satisfacc… Enquesta de S… quantitativa internet
## 3 1017 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 4 1016 Enquesta a ens locals… Enquesta a en… quantitativa internet
## 5 1015 Enquesta d'inserció l… Enquesta d'in… quantitativa telèfon
## 6 1014 Enquesta d'inserció l… Enquesta d'in… quantitativa telèfon
## 7 1013 Enquesta d'inserció l… Enquesta d'in… quantitativa telèfon
## 8 1012 Enquesta d'inserció l… Enquesta d'in… quantitativa telèfon
## 9 1011 Òmnibus de la General… Òmnibus de la… quantitativa presencial
## 10 1010 Enquesta metodològica… Enquesta meto… quantitativa internet
## # … with 1,123 more rows, and 23 more variables: Objectius <chr>,
## # `Ambit territorial` <fct>, Cost <dbl>, `Promotors enquesta` <chr>,
## # `Executors enquesta` <chr>, `Promotors estudi` <chr>,
## # `Executors estudi` <chr>, `Data de treball de camp` <chr>,
## # `Dia inici treball de camp` <date>, `Dia final treball de camp` <date>,
## # Univers <chr>, Mostra <chr>, `Mostra estudis quantitatius` <dbl>,
## # `Mostra estudis qualitatius` <chr>, `Error mostral` <chr>, …
In order to get the metadata of a specific study, the reo
argument can be used:
CEOmeta(reo = "746")
## # A tibble: 1 × 28
## REO `Titol enquesta` `Titol estudi` `Metodologia e…` `Metode de rec…`
## <fct> <chr> <chr> <fct> <fct>
## 1 746 Baròmetre d'Opinió Pol… Baròmetre d'O… quantitativa presencial
## # … with 23 more variables: Objectius <chr>, `Ambit territorial` <fct>,
## # Cost <dbl>, `Promotors enquesta` <chr>, `Executors enquesta` <chr>,
## # `Promotors estudi` <chr>, `Executors estudi` <chr>,
## # `Data de treball de camp` <chr>, `Dia inici treball de camp` <date>,
## # `Dia final treball de camp` <date>, Univers <chr>, Mostra <chr>,
## # `Mostra estudis quantitatius` <dbl>, `Mostra estudis qualitatius` <chr>,
## # `Error mostral` <chr>, `Error mostral (numèric)` <chr>, Resum <chr>, …
The first relevant argument for CEOmeta()
is search
, which is a built-in simple search engine that goes through the columns of the metadata containing potential descriptive information (title, summary, objectives and tags -descriptors-) and returns the studies that contain such keyword.
CEOmeta(search = "Medi ambient")
## Looking for entries with: medi ambient
## # A tibble: 45 × 28
## REO `Titol enquesta` `Titol estudi` `Metodologia e…` `Metode de rec…`
## <fct> <chr> <chr> <fct> <fct>
## 1 1017 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 2 1010 Enquesta metodològica… Enquesta meto… quantitativa internet
## 3 1006 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 4 941 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 5 876 Baròmetre de la bicic… Baròmetre de … quantitativa internet;telèfon
## 6 875 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 7 865 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 8 819 Baròmetre 2015 de per… Baròmetre 201… quantitativa telèfon
## 9 807 Seguiment d'Indicador… Seguiment d'i… quantitativa telèfon
## 10 805 Baròmetre de la bicic… Baròmetre de … quantitativa internet;telèfon
## # … with 35 more rows, and 23 more variables: Objectius <chr>,
## # `Ambit territorial` <fct>, Cost <dbl>, `Promotors enquesta` <chr>,
## # `Executors enquesta` <chr>, `Promotors estudi` <chr>,
## # `Executors estudi` <chr>, `Data de treball de camp` <chr>,
## # `Dia inici treball de camp` <date>, `Dia final treball de camp` <date>,
## # Univers <chr>, Mostra <chr>, `Mostra estudis quantitatius` <dbl>,
## # `Mostra estudis qualitatius` <chr>, `Error mostral` <chr>, …
It is also possible to pass more than one value to search
, so that the search includes them (either one of them OR any other).
CEOmeta(search = c("Medi ambient", "Municipi"))
## Looking for entries with: medi ambient OR municipi
## # A tibble: 49 × 28
## REO `Titol enquesta` `Titol estudi` `Metodologia e…` `Metode de rec…`
## <fct> <chr> <chr> <fct> <fct>
## 1 1017 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 2 1010 Enquesta metodològica… Enquesta meto… quantitativa internet
## 3 1006 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 4 941 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 5 876 Baròmetre de la bicic… Baròmetre de … quantitativa internet;telèfon
## 6 875 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 7 865 Seguiment d'indicador… Seguiment d'i… quantitativa telèfon
## 8 819 Baròmetre 2015 de per… Baròmetre 201… quantitativa telèfon
## 9 807 Seguiment d'Indicador… Seguiment d'i… quantitativa telèfon
## 10 805 Baròmetre de la bicic… Baròmetre de … quantitativa internet;telèfon
## # … with 39 more rows, and 23 more variables: Objectius <chr>,
## # `Ambit territorial` <fct>, Cost <dbl>, `Promotors enquesta` <chr>,
## # `Executors enquesta` <chr>, `Promotors estudi` <chr>,
## # `Executors estudi` <chr>, `Data de treball de camp` <chr>,
## # `Dia inici treball de camp` <date>, `Dia final treball de camp` <date>,
## # Univers <chr>, Mostra <chr>, `Mostra estudis quantitatius` <dbl>,
## # `Mostra estudis qualitatius` <chr>, `Error mostral` <chr>, …
In addition to the built-in argument to search through the columns of the survey title, the study title, the objectives, the summary and the tags (descriptors), it is possible to combine CEOmeta()
with dplyr
’s filter()
to limit the results of studies returned.
For example, to get the studies that have been performed using Internet to get the data:
CEOmeta() |>
filter(`Metode de recollida de dades` == "internet")
## # A tibble: 36 × 28
## REO `Titol enquesta` `Titol estudi` `Metodologia e…` `Metode de rec…`
## <fct> <chr> <chr> <fct> <fct>
## 1 1018 Enquesta de Satisfacc… Enquesta de S… quantitativa internet
## 2 1016 Enquesta a ens locals… Enquesta a en… quantitativa internet
## 3 1010 Enquesta metodològica… Enquesta meto… quantitativa internet
## 4 1000 Enquesta panel sobre … Enquesta pane… quantitativa internet
## 5 993 Enquesta de satisfacc… Enquesta de s… quantitativa internet
## 6 969 Estudi de percepció, … Estudi de per… quantitativa internet
## 7 968 Estudi de percepció, … Estudi de per… quantitativa internet
## 8 966 Enquesta sobre els us… Enquesta sobr… quantitativa internet
## 9 965 Enquesta sobre l'impa… Enquesta sobr… quantitativa internet
## 10 961 Enquesta de satisfacc… Enquesta de s… quantitativa internet
## # … with 26 more rows, and 23 more variables: Objectius <chr>,
## # `Ambit territorial` <fct>, Cost <dbl>, `Promotors enquesta` <chr>,
## # `Executors enquesta` <chr>, `Promotors estudi` <chr>,
## # `Executors estudi` <chr>, `Data de treball de camp` <chr>,
## # `Dia inici treball de camp` <date>, `Dia final treball de camp` <date>,
## # Univers <chr>, Mostra <chr>, `Mostra estudis quantitatius` <dbl>,
## # `Mostra estudis qualitatius` <chr>, `Error mostral` <chr>, …
Or to get studies with a specific quantitative sample size limit:
CEOmeta() |>
filter(`Mostra estudis quantitatius` < 500)
## # A tibble: 166 × 28
## REO `Titol enquesta` `Titol estudi` `Metodologia e…` `Metode de rec…`
## <fct> <chr> <chr> <fct> <fct>
## 1 964 Enquesta satisfacció … Enquesta sati… quantitativa autoadministrada
## 2 963 Enquesta satisfacció … Enquesta sati… quantitativa autoadministrada
## 3 957 Avaluació del grau de… Avaluació del… quantitativa presencial
## 4 950 Enquesta de satisfacc… Enquesta de s… quantitativa telèfon
## 5 933 iPLAENSA: Enquesta d'… iPLAENSA: Enq… quantitativa telèfon
## 6 930 iPLAENSA: Satisfacció… iPLAENSA: Sat… quantitativa telèfon
## 7 929 iPLAENSA: Opinió i sa… iPLAENSA: Opi… quantitativa telèfon
## 8 928 iPLAENSA: Satisfacció… iPLAENSA: Sat… quantitativa telèfon
## 9 926 Enquesta satisfacció … Enquesta sati… quantitativa telèfon
## 10 918 Enquesta satisfacció … Enquesta sati… quantitativa autoadministrada
## # … with 156 more rows, and 23 more variables: Objectius <chr>,
## # `Ambit territorial` <fct>, Cost <dbl>, `Promotors enquesta` <chr>,
## # `Executors enquesta` <chr>, `Promotors estudi` <chr>,
## # `Executors estudi` <chr>, `Data de treball de camp` <chr>,
## # `Dia inici treball de camp` <date>, `Dia final treball de camp` <date>,
## # Univers <chr>, Mostra <chr>, `Mostra estudis quantitatius` <dbl>,
## # `Mostra estudis qualitatius` <chr>, `Error mostral` <chr>, …
Metadata can be retrieved for a specific period of time, by using the arguments date_start
and date_end
, also using the YYYY-MM-DD format. In this case the dates that are taken into account are dates where the study gets into the records, not the fieldwork dates.
CEOmeta(date_start = "2019-01-01", date_end = "2019-12-31")
## # A tibble: 45 × 28
## REO `Titol enquesta` `Titol estudi` `Metodologia e…` `Metode de rec…`
## <fct> <chr> <chr> <fct> <fct>
## 1 954 Baròmetre d'Opinió Po… Baròmetre d'O… quantitativa presencial
## 2 953 Enquesta de satisfacc… Enquesta de s… quantitativa internet
## 3 952 Percepció sobre el de… Percepció sob… quantitativa presencial
## 4 951 Cosmopolitisme i loca… Cosmopolitism… quantitativa presencial
## 5 950 Enquesta de satisfacc… Enquesta de s… quantitativa telèfon
## 6 949 Enquesta sobre civism… Enquesta sobr… quantitativa internet;presen…
## 7 948 Enquesta sobre el deb… Enquesta sobr… quantitativa telèfon
## 8 947 Baròmetre sanitari de… Baròmetre san… quantitativa telèfon
## 9 946 Òmnibus de la General… Òmnibus de la… quantitativa presencial
## 10 945 Baròmetre de satisfac… Baròmetre de … quantitativa internet
## # … with 35 more rows, and 23 more variables: Objectius <chr>,
## # `Ambit territorial` <fct>, Cost <dbl>, `Promotors enquesta` <chr>,
## # `Executors enquesta` <chr>, `Promotors estudi` <chr>,
## # `Executors estudi` <chr>, `Data de treball de camp` <chr>,
## # `Dia inici treball de camp` <date>, `Dia final treball de camp` <date>,
## # Univers <chr>, Mostra <chr>, `Mostra estudis quantitatius` <dbl>,
## # `Mostra estudis qualitatius` <chr>, `Error mostral` <chr>, …
In addition, to the search engine and the restriction by time CEOmeta()
also allows to automatically open the relevant URLs at the CEO domain that contain the details of the studies gathered with the function. This can be done setting the browse
argument to TRUE
. However, there is a soft limitation of only 10 URLs to be opened, unless the user forces to really open all of them (proceed with caution, as this may open many tabs in your browser and leave your computer out of RAM in some scenarios of RAM black holes, such as Chrome).
CEOmeta(search = "Medi ambient a", browse = TRUE)
To open a specific REO, a simpler call with its specific identifier can be used:
CEOmeta(reo = "746", browse = TRUE)
It is also possible to specify an alternative language, so the default Catalan pages are substituted by the automatic translations provided by Apertium (for Occitan/Aranese) or Google Translate.
CEOmeta(search = "Medi ambient a", browse = TRUE, browse_translate = "de")
CEOsearch()
: Access to the variable and value labelsContrary to CEOdata()
and CEOmeta()
, CEOsearch()
needs at least one argument: the survey data (microdata) for which we want to extract the variable labels and the value labels. By default it provides the variable labels in a tidy object:
CEOsearch(d) # equivalent to CEOsearch(d, where = "variables")
## # A tibble: 897 × 2
## Variable Label
## <chr> <chr>
## 1 PONDERA Coeficients de ponderació
## 2 ORDRECINE Número d'ordre de registre cine
## 3 ORDRE_REVISADA Número d'ordre de registre original (variable anonimitzada)
## 4 REO Número de registre
## 5 METODOLOGIA Metodologia d'enquestació
## 6 BOP_NUM Número d'ordre del baròmetre
## 7 ANY Any de realització del baròmetre
## 8 MES Mes de realització del baròmetre
## 9 DIA Dia
## 10 HORA_INI Hora d'inici de l'entrevista (variable anonimitzada)
## # … with 887 more rows
Equivalently, the use of where = "values"
provides with a tidy object containing the value labels. Notice that in this case the variable names are repeated to accommodate each of the different value labels.
CEOsearch(d, where = "values")
## # A tibble: 13,768 × 2
## Variable Value
## <fct> <fct>
## 1 METODOLOGIA Presencial
## 2 METODOLOGIA Telefònica
## 3 METODOLOGIA En línia
## 4 BOP_NUM Març 14 - 746
## 5 BOP_NUM Oct. 14 -758
## 6 BOP_NUM Feb 15 -774
## 7 BOP_NUM Juny 15 -795
## 8 BOP_NUM Oct. 15 -804
## 9 BOP_NUM Feb. 16 -816
## 10 BOP_NUM Juny 16 -826
## # … with 13,758 more rows
Just like with the CEOmeta()
, CEOsearch()
has a simple built-in search facility that allows to retrieve only the rows that match a specific keyword(s). In the following example, we restrict the variables to those that contain “edat” (age).
CEOsearch(d, keyword = "edat")
## Looking for entries with: edat
## # A tibble: 15 × 2
## Variable Label
## <chr> <chr>
## 1 ENQUESTADOR_EDAT Edat de entrevistador/a
## 2 EDAT Edat
## 3 EDAT_GR Grups d'edat
## 4 EDAT_CEO Grups d'edat reagrupada (recodificació grups de 5 anys)
## 5 CRISI_ATUR_FAMILIAR En els últims dos anys, com a conseqüència de la crisi, …
## 6 EDAT_1 EDAT_1 (variable anonimitzada)
## 7 EDAT_2 EDAT_2 (variable anonimitzada)
## 8 EDAT_3 EDAT_3 (variable anonimitzada)
## 9 EDAT_4 EDAT_4 (variable anonimitzada)
## 10 EDAT_5 EDAT_5 (variable anonimitzada)
## 11 EDAT_6 EDAT_6 (variable anonimitzada)
## 12 EDAT_7 EDAT_7 (variable anonimitzada)
## 13 EDAT_8 EDAT_8 (variable anonimitzada)
## 14 EDAT_9 EDAT_9 (variable anonimitzada)
## 15 EDAT_10 EDAT_10 (variable anonimitzada)
Finally, an English translation of the variable labels/values is provided if the argument translate
is set to TRUE
.
CEOsearch(d, keyword = "edat", translate = TRUE)
## Looking for entries with: edat
## # A tibble: 15 × 2
## Variable Label
## <chr> <chr>
## 1 ENQUESTADOR_EDAT Edat de entrevistador/a
## 2 EDAT Edat
## 3 EDAT_GR Grups d'edat
## 4 EDAT_CEO Grups d'edat reagrupada (recodificació grups de 5 anys)
## 5 CRISI_ATUR_FAMILIAR En els últims dos anys, com a conseqüència de la crisi, …
## 6 EDAT_1 EDAT_1 (variable anonimitzada)
## 7 EDAT_2 EDAT_2 (variable anonimitzada)
## 8 EDAT_3 EDAT_3 (variable anonimitzada)
## 9 EDAT_4 EDAT_4 (variable anonimitzada)
## 10 EDAT_5 EDAT_5 (variable anonimitzada)
## 11 EDAT_6 EDAT_6 (variable anonimitzada)
## 12 EDAT_7 EDAT_7 (variable anonimitzada)
## 13 EDAT_8 EDAT_8 (variable anonimitzada)
## 14 EDAT_9 EDAT_9 (variable anonimitzada)
## 15 EDAT_10 EDAT_10 (variable anonimitzada)
Of course, variable labels and values can be merged into a single object using a combination of join
and CEOsearch()
:
CEOsearch(d) |>
left_join(CEOsearch(d, where = "values"))
## Joining, by = "Variable"
## # A tibble: 13,842 × 3
## Variable Label Value
## <chr> <chr> <fct>
## 1 PONDERA Coeficients de ponderació <NA>
## 2 ORDRECINE Número d'ordre de registre cine <NA>
## 3 ORDRE_REVISADA Número d'ordre de registre original (variable anonimitz… <NA>
## 4 REO Número de registre <NA>
## 5 METODOLOGIA Metodologia d'enquestació Pres…
## 6 METODOLOGIA Metodologia d'enquestació Tele…
## 7 METODOLOGIA Metodologia d'enquestació En l…
## 8 BOP_NUM Número d'ordre del baròmetre Març…
## 9 BOP_NUM Número d'ordre del baròmetre Oct.…
## 10 BOP_NUM Número d'ordre del baròmetre Feb …
## # … with 13,832 more rows
The development of CEOdata
(track changes, propose improvements, report bugs) can be followed at github.
If using the data and the package, please cite and acknowledge properly the CEO and the package, respectively.