diff --git a/ISO27001effectiveness/DESCRIPTION b/ISO27001effectiveness/DESCRIPTION index 90fd11a..dc50cb8 100644 --- a/ISO27001effectiveness/DESCRIPTION +++ b/ISO27001effectiveness/DESCRIPTION @@ -2,7 +2,7 @@ Package: ISO27001effectiveness Type: Package Title: Study about how ISO27001 certifications affect cyberattacks Version: 0.1.0 -Author: Miguel Tu帽on, Patricia Lopez, Sara Queipo, Imanol-Mikel Barba +Author: Miguel Tu駉n, Patricia Lopez, Sara Queipo, Imanol-Mikel Barba Maintainer: The DDS development team Description: Compare the cyberattacks reported in hackmaggedon website with data obtained from the official ISO survey to 27001. Working around countries, @@ -14,4 +14,5 @@ RoxygenNote: 5.0.1 Imports: xlsx, ggplot2, countrycode, - dplyr + dplyr, + tidyr diff --git a/ISO27001effectiveness/R/Libraries.R b/ISO27001effectiveness/R/Libraries.R index 80ec13a..c0d38ba 100644 --- a/ISO27001effectiveness/R/Libraries.R +++ b/ISO27001effectiveness/R/Libraries.R @@ -2,3 +2,4 @@ library(xlsx) library(ggplot2) library(countrycode) library(dplyr) +library(tidyr) diff --git a/ISO27001effectiveness/R/ReportGraphs.R b/ISO27001effectiveness/R/ReportGraphs.R index 10c09e5..c4d8152 100644 --- a/ISO27001effectiveness/R/ReportGraphs.R +++ b/ISO27001effectiveness/R/ReportGraphs.R @@ -1,3 +1,8 @@ + +#---------------------------------------------------------------- +#-------------------------General evolution---------------------- +#---------------------------------------------------------------- + GetAttacksEvolution <- function(Attacks){ attacks.evol <- mutate(Attacks, Year = format(Attacks$Date, "%Y")) %>% group_by(Year) @@ -49,7 +54,6 @@ GetCertsEvolution <- function(Certs){ } - GetAttacksMonthEvolution <- function(Attacks){ attacks.evol <- mutate(Attacks, Year = format(Attacks$Date, "%Y-%m")) %>% group_by(Year) @@ -77,6 +81,9 @@ GetAttacksMonthEvolution <- function(Attacks){ } +#---------------------------------------------------------------- +#-------------------------Attack type evolution------------------ +#---------------------------------------------------------------- GetAttackTypePie <- function (Attacks){ @@ -101,7 +108,7 @@ GetAttackTypePie <- function (Attacks){ theme(plot.title = element_text(hjust = 0.5), axis.title.x=element_blank(), axis.title.y=element_blank()) + - ggtitle("Attack type pie") + ggtitle("Attacks pie") graph1 } @@ -160,7 +167,6 @@ GetAttackTypeEvolution <- function(Attacks){ } - GetAttackTypeTopEvolution <- function(Attacks){ Attacks.pre <- mutate(Attacks, Year = format(Attacks$Date, "%Y")) %>% group_by(Year, Attack.standar) Attacks.pre <- as.data.frame(table(Attacks.pre$Year, Attacks.pre$Attack.standar)) @@ -251,8 +257,253 @@ GetAttackTypeTopEvolution <- function(Attacks){ } +#---------------------------------------------------------------- +#-------------------------Geolocal evolution--------- +#---------------------------------------------------------------- + +GetContinentPie <- function (Attacks, Cert_PerCountry){ + + attack.pie <- group_by(Attacks, Continent) + attack.pie <- as.data.frame(table(attack.pie$Continent)) + attack.pie <- setNames(attack.pie, c("Continent", "Count")) + + attack.pie <- attack.pie[attack.pie$Continent != "",] + #attack.pie <- attack.pie[attack.pie$Count > (sum(attack.pie$Count) * 0.01),] + + graph1 <- ggplot(data=attack.pie, + aes(x=factor(1), + y=Count, + fill=Continent)) + + geom_col(width = 1, color='black') + + geom_label(aes(label=paste(round(100 * attack.pie$Count / sum(attack.pie$Count), 2), "%")), + vjust=c(-2.5, 0, 2, 0, -2.5), + hjust=c(1.4, 1, 0.5, 0.5, 0)) + + coord_polar(theta="y") + + scale_x_discrete(labels = c("")) + + scale_y_discrete(labels = c("")) + + theme(plot.title = element_text(hjust = 0.5), + axis.title.x=element_blank(), + axis.title.y=element_blank()) + + ggtitle("Attacks") + + cert.pie <- mutate(Cert_PerCountry, Total = X2011 + X2012 + X2013 + X2014 + X2015) %>% + group_by(Continent) + cert.pie <- data.frame(Continent = c("Asia", "Europe", "Africa", "Americas", "Oceania"), + Count = c(sum((cert.pie[cert.pie$Continent == "Asia",])$Total), + sum((cert.pie[cert.pie$Continent == "Europe",])$Total), + sum((cert.pie[cert.pie$Continent == "Africa",])$Total), + sum((cert.pie[cert.pie$Continent == "Americas",])$Total), + sum((cert.pie[cert.pie$Continent == "Oceania",])$Total))) + graph2 <- ggplot(data=cert.pie, + aes(x=factor(1), + y=Count, + fill=Continent)) + + geom_col(width = 1, color='black') + + geom_label(aes(label=paste(round(100 * cert.pie$Count / sum(cert.pie$Count), 2), "%")), + vjust=c(0, -1.5, -2.5, -2.5, -2.5), + hjust=c(0.5, 0.2, 0.5, 1.8, -0.5)) + + coord_polar(theta="y") + + scale_x_discrete(labels = c("")) + + scale_y_discrete(labels = c("")) + + theme(plot.title = element_text(hjust = 0.5), + axis.title.x=element_blank(), + axis.title.y=element_blank()) + + ggtitle("ISO 27001") + + list(graph1, graph2) +} + +GetContinentAttacksEvolution <- function(Attacks){ + + attacks.evol <- mutate(Attacks, Year = format(Attacks$Date, "%Y")) %>% group_by(Continent, Year) + attacks.evol <- as.data.frame(table(attacks.evol$Continent, attacks.evol$Year)) + colnames(attacks.evol) <- c("Continent", "Year","Attacks") + + attacks.evol <- attacks.evol[attacks.evol$Continent != "Oceania",] + attacks.evol <- attacks.evol[attacks.evol$Continent != "Africa",] + + graph1 <- ggplot2::qplot(main = "Cyberattacks evolution", + x = attacks.evol$Year, + y = attacks.evol$Attacks, + group = Continent, + xlab = "Years", + ylab = "Attacks", + data = attacks.evol, + geom = "point", + color = Continent) + + geom_line() + + theme(plot.title = element_text(hjust = 0.5)) + + graph1 + +} + +GetContinentCertsEvolution <- function(Cert_PerCountry){ + + certs.evol <- gather(Cert_PerCountry, "Year", "Certs", 2:6) %>% group_by(Continent, Year) + + certs.evol <- summarise(certs.evol, + #Continent = Continent, + #Year = Year, + Certs = sum(Certs)) + certs.evol$Year <- substr(certs.evol$Year,2,5) + + certs.evol <- certs.evol[certs.evol$Continent != "Oceania",] + certs.evol <- certs.evol[certs.evol$Continent != "Africa",] + + graph1 <- ggplot2::qplot(main = "ISO 27001 evolution", + x = certs.evol$Year, + y = certs.evol$Certs, + group = Continent, + xlab = "Years", + ylab = "Certifications", + data = certs.evol, + geom = "point", + color = Continent) + + geom_line() + + theme(plot.title = element_text(hjust = 0.5)) + + graph1 + +} + +GetContinentAttacksTopEvolution <- function(Attacks){ + attacks.evol <- mutate(Attacks, Year = format(Attacks$Date, "%Y")) %>% group_by(Year, Continent) + attacks.evol <- as.data.frame(table(attacks.evol$Year, attacks.evol$Continent)) + attacks.evol <- setNames(attacks.evol, c("Year", "Continent", "Count")) + attacks.evol <- attacks.evol[attacks.evol$Continent != "",] + + attacks.evol <- spread(attacks.evol, "Continent", "Count") + + graph1 <- ggplot(data = attacks.evol, + aes(x = Year, y = Americas, group = 1)) + + + geom_line() + + geom_point() + + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("Americas") + + xlab("Years") + ylab("Attacks")+ + stat_smooth(method = "lm", se = FALSE, aes(outfit=fit<<-..y..)) + + graph2 <- ggplot(data = attacks.evol, + aes(x = Year, y = Asia, group = 1)) + + + geom_line() + + geom_point() + + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("Asia") + + xlab("Years") + ylab("Attacks")+ + stat_smooth(method = "lm", se = FALSE, aes(outfit=fit<<-..y..)) + + graph3 <- ggplot(data = attacks.evol, + aes(x = Year, y = Europe, group = 1)) + + + geom_line() + + geom_point() + + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("Europe") + + xlab("Years") + ylab("Attacks")+ + stat_smooth(method = "lm", se = FALSE, aes(outfit=fit<<-..y..)) + + + list(graph1, graph2, graph3) + +} + +GetContinentCertsTopEvolution <- function(Attacks){ + + certs.evol <- gather(Cert_PerCountry, "Year", "Certs", 2:6) %>% group_by(Continent, Year) + certs.evol <- summarise(certs.evol, + #Continent = Continent, + #Year = Year, + Certs = sum(Certs)) + certs.evol$Year <- substr(certs.evol$Year,2,5) + + certs.evol <- spread(certs.evol, "Continent", "Certs") + + graph1 <- ggplot(data = certs.evol, + aes(x = Year, y = Americas, group = 1)) + + + geom_line() + + geom_point() + + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("Americas") + + xlab("Years") + ylab("Certifications")+ + stat_smooth(method = "lm", se = FALSE, aes(outfit=fit<<-..y..)) + + graph2 <- ggplot(data = certs.evol, + aes(x = Year, y = Asia, group = 1)) + + + geom_line() + + geom_point() + + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("Asia") + + xlab("Years") + ylab("Certifications")+ + stat_smooth(method = "lm", se = FALSE, aes(outfit=fit<<-..y..)) + + graph3 <- ggplot(data = certs.evol, + aes(x = Year, y = Europe, group = 1)) + + + geom_line() + + geom_point() + + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("Europe") + + xlab("Years") + ylab("Certifications")+ + stat_smooth(method = "lm", se = FALSE, aes(outfit=fit<<-..y..)) + + + list(graph1, graph2, graph3) + +} + +GetCountriesCol <- function(Attacks, Cert_PerCountry){ + + certs.evol <- gather(Cert_PerCountry, "Year", "Certs", 2:6) %>% group_by(Continent, country_short) + + certs.evol <- summarise(certs.evol, + Certs = sum(Certs)) + + graph1 <- ggplot2::ggplot(aes(x = reorder(country_short, Certs), + y = Certs), + data = certs.evol[certs.evol$Certs > (sum(certs.evol$Certs) * 0.02),]) + + geom_col(aes(fill = Continent)) + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("ISO 27001") + + xlab("Country") + ylab("Certifications") + + attacks.evol <- mutate(Attacks, Year = format(Attacks$Date, "%Y")) %>% group_by(Year, Continent, Country) + attacks.evol <- as.data.frame(table(attacks.evol$Year, attacks.evol$Continent, attacks.evol$Country)) + attacks.evol <- setNames(attacks.evol, c("Year", "Continent", "Country", "Count")) + attacks.evol <- attacks.evol[attacks.evol$Continent != "",] + attacks.evol <- attacks.evol[attacks.evol$Country != "",] + attacks.evol <- attacks.evol[attacks.evol$Country != "AU",] + + attacks.evol <- attacks.evol[attacks.evol$Count > (sum((attacks.evol[attacks.evol$Country != "US",])$Count) * 0.01),] + attacks.evol <- arrange(attacks.evol, Count) + + + graph2 <- ggplot2::ggplot(aes(x = reorder(Country, Count), + y = Count), + data = attacks.evol) + + geom_col(aes(fill = Continent)) + + theme(plot.title = element_text(hjust = 0.5)) + + ggtitle("Attacks") + + xlab("Country") + ylab("Attacks") + + list(graph1, graph2) + + } +#---------------------------------------------------------------- +#---------------------------------------------------------------- +#---------------------------------------------------------------- GetBaseCertsGraph <- function(Cert_PerCountry, year){ diff --git a/ISO27001effectiveness/Report.Rmd b/ISO27001effectiveness/Report.Rmd index ebf19a2..f906f9f 100644 --- a/ISO27001effectiveness/Report.Rmd +++ b/ISO27001effectiveness/Report.Rmd @@ -5,13 +5,14 @@ output: pdf_document: default --- -```{r setup, include=TRUE, echo=FALSE, warning=FALSE, results='hide', message=FALSE} +```{r setup, include=TRUE, echo=FALSE, warning=FALSE, results='hide', message=FALSE ,cache=FALSE} library(knitr) knitr::opts_chunk$set(echo = FALSE) knitr::opts_chunk$set(warning = FALSE) knitr::opts_chunk$set(message = FALSE) +knitr::opts_chunk$set(cache = FALSE) devtools::load_all(".") ``` @@ -161,7 +162,83 @@ La tendencia con una mayor pendiente negativa es _Injection_ (`r slope3`) y junt Por otro lado tenemos _DNS_ cuya tendencia tambi茅n tiene una pendiente negativa (`r slope6`), pero es muy moderada y adem谩s podemos observar que los casos reportados en nuestra fuente de datos son mas bien escasos. -### Evoluci贸n por tipo de ataque +### Evoluci贸n geogr谩fica + +Este apartado estudiar谩 la relaci贸n entre la certificaci贸n ISO 27001 y los ataques producidos, pero teniendo en cuenta la variable geogr谩fica, ya que es posible que la certificaci贸n, aunque sea internacional, se implemente de una mejor o peor forma seg煤n la regi贸n geogr谩fica. En primer lugar observaremos la comparaci贸n por continente. + +```{r fig.width=4.5, fig.height=3,out.extra='style="float:left"'} +graphs <- ISO27001effectiveness::GetContinentPie(Attacks, Cert_PerCountry) +graphs[[1]] +``` +```{r fig.width=4.5, fig.height=3} +graphs[[2]] +``` + +Se puede observar a simple vista que los continentes que reciben m谩s ataques, por una cuesti贸n l贸gica de superficie e intereses, son por orden Am茅rica, Asia y Europa. En cambio los continentes que mas certificaciones ISO 27001 obtienen son por orden Asia, Europa y Am茅rica. Tanto 脕frica como Oceania podemos descartarlos en este estudio ya que sus porcentajes no son relevantes. Observemos ahora c贸mo influye esto en el tiempo. + +```{r fig.width=4.5, fig.height=4,out.extra='style="float:left"'} +ISO27001effectiveness::GetContinentCertsEvolution(Cert_PerCountry) +``` +```{r fig.width=4.5, fig.height=4} +ISO27001effectiveness::GetContinentAttacksEvolution(Attacks) +``` + +Se puede observar que la tendencia de las certificaciones es creciente mientras que la de los ataques es decreciente, pero procederemos a comparar cada una individualmente para poder demostrarlo num茅ricamente y no solo aparentemente. + +```{r fig.width=4.5, fig.height=3,out.extra='style="float:left"'} +topAttacks <- ISO27001effectiveness::GetContinentAttacksTopEvolution(Attacks) +topCerts <- ISO27001effectiveness::GetContinentCertsTopEvolution(Cert_PerCountry) +topCerts[[1]] +slope_Ame_Cert <- (fit[5] - fit[1]) / 4 +``` +```{r fig.width=4.5, fig.height=3} +topAttacks[[1]] +slope_Ame_Att <- (fit[5] - fit[1]) / 4 +``` + +La pendiente de los ataques para _Am茅rica_ es `r slope_Ame_Att` mientras que la pendiente de las certificaciones es `r slope_Ame_Cert`. + +```{r fig.width=4.5, fig.height=3,out.extra='style="float:left"'} +topCerts[[2]] +slope_Asi_Cert <- (fit[5] - fit[1]) / 4 +``` +```{r fig.width=4.5, fig.height=3} +topAttacks[[2]] +slope_Asi_Att <- (fit[5] - fit[1]) / 4 +``` + +La pendiente de los ataques para _Asia_ es `r slope_Asi_Att` mientras que la pendiente de las certificaciones es `r slope_Asi_Cert`. + +```{r fig.width=4.5, fig.height=3,out.extra='style="float:left"'} +topCerts[[3]] +slope_Eu_Cert <- (fit[5] - fit[1]) / 4 +``` +```{r fig.width=4.5, fig.height=3} +topAttacks[[3]] +slope_Eu_Att <- (fit[5] - fit[1]) / 4 +``` + +La pendiente de los ataques para _Europa_ es `r slope_Eu_Att` mientras que la pendiente de las certificaciones es `r slope_Eu_Cert`. + +Todas las pendientes podr铆an representar la relaci贸n que buscamos, en la que un aumento en las certificaciones produce un descenso en los ataques. + +El an谩lisis puede aumentar en profundidad estableciendo superficies geogr谩ficas m谩s peque帽as y asi obtener m谩s precisi贸n, observemos lo que ocurre a nivel de paises. Se mostrar谩n a continuaci贸n los paises que superan aproximadamente un 2% de los ataques/certificaciones totales ya que la lista total de paises es demasiado extensa. + +```{r fig.width=4.5, fig.height=3,out.extra='style="float:left"'} +top <- GetCountriesCol(Attacks, Cert_PerCountry) +top[[1]] +``` +```{r fig.width=4.5, fig.height=3} +top[[2]] +``` + +Como se puede observar en la parte de certificaciones destaca de largo Jap贸n sobre los dem谩s, que se encuentra bastante bajo en la lista de ataques. Y al reves pasa algo parecido, en los ataques destaca Estados Unidos por mucho mientras que ese mismo pais est谩 muy bajo en certificaciones. A continuaci贸n observaremos la evoluci贸n temporal del top 3 paises en ataques recibidos y en certificaciones obtenidas, varios de ellos coinciden, tenemos por la parte de las certificaciones a _Jap贸n_, por la parte de los ataques a _Estados Unidos_, y com煤n a ambas _Reino Unido_ e _India_. + + + + + +# Viejo De los datos mostrados se pueden hacer diferentes observaciones: diff --git a/ISO27001effectiveness/Report.html b/ISO27001effectiveness/Report.html index 8641296..044d798 100644 --- a/ISO27001effectiveness/Report.html +++ b/ISO27001effectiveness/Report.html @@ -340,15 +340,15 @@ $(document).ready(function () {

Evoluci贸n general

En primer lugar, para saber si este estudio tiene sentido, se observar谩 la evoluci贸n temporal tanto de los ciberataques reportados como de las certificaciones realizadas en busca de patrones que puedan indicar una relaci贸n entre ambas evoluciones.

-

+

Como se puede observar en las gr谩ficas, el n煤mero de empresas que obtienen la certificaci贸n crece anualmente, mientras que el numero de ataques es un poco m谩s inestable. Del a帽o 2013 al 2014 el n煤mero de ataques se reduce dr谩sticamente, esto puede deberse a un problema en la fuente de datos, ya que al depender directamente de un ser humano pueden existir intervalos en los que se hayan registrado menos datos (por problemas del administrador, como falta de tiempo o interes). Otra explicaci贸n plausible es que justo en el a帽o 2013 se produjo una revisi贸n de la certificaci贸n, produciendose la ISO 27001:2013 que sustituy贸 a su predecesora 27001:2005, los cambios realizados pueden consultarse en la web oficial. Para indagar un poco sobre este tema a continuaci贸n se representa la evoluci贸n de los ataques mes a mes, al aumentar la precisi贸n en el eje X se puede observar mejor la tendencia y abstraernos un poco de esos errores humanos.

-

+

Podemos observar que la tendencia de los ataques tiene una pendiente negativa, mas pronunciada en el momento en que se realiza una actualizaci贸n de las normas (27001:2013) y que presenta algo parecido, aunque muy moderada, a una recuperaci贸n, pasado un periodo de tiempo. Tambi茅n se podr铆a relacionar la evoluci贸n de los ataques con la evoluci贸n de los certificados, si tenemos en cuenta el desplazamiento de un a帽o para establecer la relaci贸n de causalidad. Por ejemplo podemos observar como los a帽os en que menos crece el n煤mero de certificaciones (2012 y 2014), los ataques aumentan ligeramente en los a帽os siguientes (2013 y 2015), mientras que en los a帽os que mayor es el aumento de las mismas (2013 y 2015) la cantidad de ataques producidos disminuye para los a帽os consecutivos (2014 y 2016).

Evoluci贸n por tipo de ataque

Podr铆a darse el caso de que la certificaci贸n tenga uan efectividad mayor contra ciertas t茅cnicas de ataque y que dicha efectividad se camufle entre el resto de t茅cnicas, por ello contemplamos el estudio individual de los diferentes tipos de ataques definidos en nuestra fuente de datos. Existen multitud de ellos por lo que el estudio se tendr谩 que centrar en una peque帽a parte de ellos, los m谩s empleados. Para llevar a cabo esta elecci贸n se representan a continuaci贸n aquellos que representan al menos un 1% del total de ataques producidos.

-

+

Como se puede observar en el gr谩fico anterior, la mayor parte de los ataques registrados en nuestra fuente de datos emplean las siguientes t茅cnicas, que ser谩n las estudiadas a continuaci贸n:

-

+

Como podemos observar en la evoluci贸n temporal reflejada en el gr谩fico, existen ciertas t茅cnicas que mas o menos son constantes en el tiempo, y existen otras que tienen o podrian tener una pendiente negativa clara. Nos centraremos en aquellos tipos de ataques que muestran dicha tendencia al descenso y que podremos observar a continuaci贸n.

-

+

Los tipos de ataque est谩n ordenados por la pendiente de su tendencia, de menor a mayor, para reflejar cu谩les est谩n descendiendo m谩s r谩pido y por lo tanto cu谩les podr铆an reflejar mejor el aumento de certificaciones ISO27001 expedidas.

Tanto Malware como Account Hijacking tienen una tendencia con pendiente positiva, 10.1 y 20.2 respectivamente, por lo que quedan descartadas para este estudio.

-

La tendencia con una mayor pendiente negativa es Injection (-173.5) y junto con DDoS (-49.3), que tambi茅n tiene una tendencia llamativa, pueden ser los que est茅n mas relacionados con la efectividad de la certificaci贸n ISO 27001.

+

La tendencia con una mayor pendiente negativa es Injection (-173.5) y junto con DDoS (-49.2), que tambi茅n tiene una tendencia llamativa, pueden ser los que est茅n mas relacionados con la efectividad de la certificaci贸n ISO 27001.

Por otro lado tenemos DNS cuya tendencia tambi茅n tiene una pendiente negativa (-3.8), pero es muy moderada y adem谩s podemos observar que los casos reportados en nuestra fuente de datos son mas bien escasos.

+
+
+

Evoluci贸n geogr谩fica

+

Este apartado estudiar谩 la relaci贸n entre la certificaci贸n ISO 27001 y los ataques producidos, pero teniendo en cuenta la variable geogr谩fica, ya que es posible que la certificaci贸n, aunque sea internacional, se implemente de una mejor o peor forma seg煤n la regi贸n geogr谩fica. En primer lugar observaremos la comparaci贸n por continente.

+

+

Se puede observar a simple vista que los continentes que reciben m谩s ataques, por una cuesti贸n l贸gica de superficie e intereses, son por orden Am茅rica, Asia y Europa. En cambio los continentes que mas certificaciones ISO 27001 obtienen son por orden Asia, Europa y Am茅rica. Tanto 脕frica como Oceania podemos descartarlos en este estudio ya que sus porcentajes no son relevantes. Observemos ahora c贸mo influye esto en el tiempo.

+

+

Se puede observar que la tendencia de las certificaciones es creciente mientras que la de los ataques es decreciente, pero procederemos a comparar cada una individualmente para poder demostrarlo num茅ricamente y no solo aparentemente.

+

+

La pendiente de los ataques para Am茅rica es -100.8 mientras que la pendiente de las certificaciones es 275.2.

+

+

La pendiente de los ataques para Asia es -58.4 mientras que la pendiente de las certificaciones es 1008.4.

+

+

La pendiente de los ataques para Europa es -57.4 mientras que la pendiente de las certificaciones es 1209.4.

+

Todas las pendientes podr铆an representar la relaci贸n que buscamos, en la que un aumento en las certificaciones produce un descenso en los ataques.

+

El an谩lisis puede aumentar en profundidad estableciendo superficies geogr谩ficas m谩s peque帽as y asi obtener m谩s precisi贸n, observemos lo que ocurre a nivel de paises. Se mostrar谩n a continuaci贸n los paises que superan aproximadamente un 2% de los ataques/certificaciones totales ya que la lista total de paises es demasiado extensa.

+

+

Como se puede observar en la parte de certificaciones destaca de largo Jap贸n sobre los dem谩s, que se encuentra bastante bajo en la lista de ataques. Y al reves pasa algo parecido, en los ataques destaca Estados Unidos por mucho mientras que ese mismo pais est谩 muy bajo en certificaciones. A continuaci贸n observaremos la evoluci贸n temporal del top 3 paises en ataques recibidos y en certificaciones obtenidas.

+
+ +
+

Viejo

De los datos mostrados se pueden hacer diferentes observaciones:

La primera hip贸tesis puede ser comprobada con los datos que disponemos. A continuaci贸n se muestra una l铆nea temporal de ciberataques globales entre los a帽os 2012 y 2015.

Observamos que se produjo lo contrario, baj贸 el n煤mero de ciberataques.

-
-

Conclusiones

Por lo observado anteriormente, se puede concluir que:

@@ -397,6 +417,7 @@ $(document).ready(function () {

Creemos que la investigaci贸n de estas cuestiones puede dar m谩s robustez a las conclusiones expuestas en este estudio.

+ diff --git a/ISO27001effectiveness/Report_cache/html/__packages b/ISO27001effectiveness/Report_cache/html/__packages index 606e93b..1ab873d 100644 --- a/ISO27001effectiveness/Report_cache/html/__packages +++ b/ISO27001effectiveness/Report_cache/html/__packages @@ -7,3 +7,4 @@ ggplot2 countrycode dplyr ISO27001effectiveness +tidyr diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.RData new file mode 100644 index 0000000..e462779 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.rdb new file mode 100644 index 0000000..7bc246e --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.rdx new file mode 100644 index 0000000..7be648f --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-10_17b6bd20fff5afd30e114864f634b0a1.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.RData new file mode 100644 index 0000000..1c9dd26 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.rdb new file mode 100644 index 0000000..835b209 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.rdx new file mode 100644 index 0000000..d9ce979 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-11_35c42ea5a3589f64604aabd4751df60e.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.RData new file mode 100644 index 0000000..065c3c9 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.rdb new file mode 100644 index 0000000..83be0a7 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.rdx new file mode 100644 index 0000000..1e7f2b5 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-12_119d22b1a0bc34c6e19d852c49915933.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.RData new file mode 100644 index 0000000..5978c3f --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.rdb new file mode 100644 index 0000000..a3a2389 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.rdx new file mode 100644 index 0000000..454038f --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-13_06ad67a944d14cc019066879ed2240a5.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.RData new file mode 100644 index 0000000..fedc543 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.rdb new file mode 100644 index 0000000..797f5c1 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.rdx new file mode 100644 index 0000000..76a8827 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-14_550a19d3da14734bf499443fd706e7b8.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.RData new file mode 100644 index 0000000..964201e --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.rdb new file mode 100644 index 0000000..61ab933 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.rdx new file mode 100644 index 0000000..dbb6b5b --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-15_8feab3edd324e25728a3fbcb795341ad.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.RData new file mode 100644 index 0000000..ffa8b02 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.rdb new file mode 100644 index 0000000..7f65e6f --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.rdx new file mode 100644 index 0000000..5b24d13 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-16_8b38a46c429570c1e4effbed86dc1635.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.RData new file mode 100644 index 0000000..a5feda5 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-17_4d31878dda08c5021db71b23e486c52c.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.RData new file mode 100644 index 0000000..aa361cc --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-18_6358c7d428bf5bf4082e6b52dadf93e9.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.RData new file mode 100644 index 0000000..3aaa60b --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-19_f4271dbb738eca511b01d5c5455089c2.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.RData index aba7420..a00af17 100644 --- a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.RData +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdb index 9681546..a33e14f 100644 --- a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdb +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdx index 440a4f1..4cc6098 100644 --- a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdx +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-1_43e2926c645dcae693d576a7d71e251e.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.RData new file mode 100644 index 0000000..0b5d483 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-2_7cc5da9749300e4634cfe6ef70545970.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.RData new file mode 100644 index 0000000..d3d0868 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-3_464aaf0bbda7c016c728eb550f1c475a.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.RData new file mode 100644 index 0000000..78a2b8d --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-4_ec9298a08039eef6645e907d10fc9641.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.RData new file mode 100644 index 0000000..2fb22b9 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-5_fbd34b98bc148a4ba3641ddf9bb672b9.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.RData new file mode 100644 index 0000000..2a2e090 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-6_ca7645dbac5629d4287b5286c911361b.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.RData new file mode 100644 index 0000000..34b1321 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-7_3747be1a7a90e98f041951aaa232fef4.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.RData new file mode 100644 index 0000000..d7b8bf9 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-8_990b7adde1fd9415c64b055559d9e5d0.rdx diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.RData b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.RData new file mode 100644 index 0000000..106f4e3 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.RData diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.rdb b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.rdb new file mode 100644 index 0000000..e69de29 --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.rdb diff --git a/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.rdx b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.rdx new file mode 100644 index 0000000..e12532c --- /dev/null +++ b/ISO27001effectiveness/Report_cache/html/unnamed-chunk-9_c0eab699e8f768d4a14dacae7c5a8d0f.rdx diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-11-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-11-1.png index b58e118..4e5fe34 100644 --- a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-11-1.png +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-11-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-12-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-12-1.png index ad3285d..f4984ae 100644 --- a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-12-1.png +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-12-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-16-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-16-1.png new file mode 100644 index 0000000..82293a1 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-16-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-17-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-17-1.png new file mode 100644 index 0000000..65e8bb3 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-17-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-18-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-18-1.png new file mode 100644 index 0000000..9370eb6 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-18-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-19-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-19-1.png new file mode 100644 index 0000000..fa83029 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-19-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-20-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-20-1.png new file mode 100644 index 0000000..f256d3a --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-20-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-21-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-21-1.png new file mode 100644 index 0000000..5921062 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-21-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-22-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-22-1.png new file mode 100644 index 0000000..aae1c76 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-22-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-23-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-23-1.png new file mode 100644 index 0000000..1a8b626 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-23-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-24-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-24-1.png new file mode 100644 index 0000000..d71417a --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-24-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-25-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-25-1.png new file mode 100644 index 0000000..c830b98 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-25-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-26-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-26-1.png new file mode 100644 index 0000000..95d1485 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-26-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-27-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-27-1.png new file mode 100644 index 0000000..3b4ae72 --- /dev/null +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-27-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-6-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-6-1.png index 219c04f..c7bb179 100644 --- a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-6-1.png +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-6-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-7-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-7-1.png index 29cba0d..79e398d 100644 --- a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-7-1.png +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-7-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-8-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-8-1.png index 258606a..4fe7b54 100644 --- a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-8-1.png +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-8-1.png diff --git a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-9-1.png b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-9-1.png index 9f4beb3..2be7fc0 100644 --- a/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-9-1.png +++ b/ISO27001effectiveness/Report_files/figure-html/unnamed-chunk-9-1.png