rm(list = ls())
fpackage.check <- function(packages) {
lapply(packages, FUN = function(x) {
if (!require(x, character.only = TRUE)) {
install.packages(x, dependencies = TRUE)
library(x, character.only = TRUE)
}
})
}
fsave <- function(x, file = NULL, location = "./data/processed/") {
ifelse(!dir.exists("data"), dir.create("data"), FALSE)
ifelse(!dir.exists("data/processed"), dir.create("data/processed"), FALSE)
if (is.null(file))
file = deparse(substitute(x))
datename <- substr(gsub("[:-]", "", Sys.time()), 1, 8)
totalname <- paste(location, file, "_", datename, ".rda", sep = "")
save(x, file = totalname) #need to fix if file is reloaded as input name, not as x.
}
fload <- function(filename) {
load(filename)
get(ls()[ls() != "filename"])
}
fshowdf <- function(x, ...) {
knitr::kable(x, digits = 3, "html", ...) %>%
kableExtra::kable_styling(bootstrap_options = c("striped", "hover")) %>%
kableExtra::scroll_box(width = "100%", height = "300px")
}
colorize <- function(x, color) {
sprintf("<span style='color: %s;'>%s</span>", color, x)
}
efronsquared <- function(actual, predicted) {
1 - (sum((actual - predicted)^2)/sum((actual - mean(actual))^2))
}
packages = c("ggplot2", "ggpubr", "tidyverse", "RColorBrewer", "stringdist", "stringi", "future.apply",
"gamlss", "gamlss.dist", "gamlss.tr", "splines", "splines2", "psych", "MASS", "dplyr", "flextable",
"fastDummies", "fixest")
# load dplyr last otherwise conflict with select from MASS
fpackage.check(packages)
We use three processed datasets.
20240717df_ppf.rda
: person period file for main
analysis20240717df_pubs.rda
: publications for
descriptives20240711linked_pubs_oa_fields.rda
: publications linked
to fieldsdf_ppf <- fload(file = "./data/processed/20240717df_ppf.rda")
df_pubs <- fload(file = "./data/processed/20240717df_pubs.rda")
df_fields <- fload(file = "./data/processed/20240711linked_pubs_oa_fields.rda")
I will use all publications. Also the publications of 2020 and later, as I think this indicates the field/domain the author was working in during Covid.
I don’t pick the top domain, but calculate a percentage within domain. This does imho more justice to multidisciplinary and also takes into account possible arbitrariness in the black box of openalex domain identifier.
domain <- df_fields %>%
dplyr::select("domain", "id") %>%
filter(!is.na(domain)) %>%
mutate(domain2 = as.numeric(as.factor(domain))) %>%
# make numeric of domain variable
group_by(id) %>%
# number of publications domain is based domain as proportions
mutate(npubs_domain = n(), health_domain = sum(domain2 == 1)/npubs_domain, life_domain = sum(domain2 ==
2)/npubs_domain, physical_domain = sum(domain2 == 3)/npubs_domain, social_domain = sum(domain2 ==
4)/npubs_domain) %>%
# only keep one record per id
ungroup() %>%
mutate(id.dup = ifelse(duplicated(id), 1, 0)) %>%
filter(id.dup == 0) %>%
dplyr::select("id", "npubs_domain", "health_domain", "life_domain", "physical_domain", "social_domain")
# describe(domain)
add to our df_ppf
df_ppf <- df_ppf %>%
left_join(domain)
It would be nice to say something about who the scholars are without a valid score on the gender variable.
Be aware that the correct gender variable in df_pubs is gender_2.
df_gender <- df_pubs %>%
ungroup() %>%
mutate(id.dup = ifelse(duplicated(id), 1, 0)) %>%
filter(id.dup == 0) %>%
dplyr::select("id", "gender_2", "firstname", "lastname") %>%
mutate(gender2 = ifelse(is.na(firstname) & is.na(gender_2), 3, gender_2))
df_gender$gender2[is.na(df_gender$gender2)] <- 4
df_gender$gender2 <- as.factor(df_gender$gender2)
levels(df_gender$gender2) <- c("men", "women", "no first name", "missing")
# table(df_gender$gender_2, useNA = 'always') table(df_gender$gender2, useNA = 'always')
tdf_gender <- df_gender %>%
filter(is.na(gender_2)) %>%
dplyr::select("id", "gender2", "firstname", "lastname")
fshowdf(tdf_gender)
id | gender2 | firstname | lastname |
---|---|---|---|
i76a053e004 | missing | wilmad | kuiper |
i986a786c80 | no first name | NA | vroonhoven |
i19d60fb662 | missing | agni | kalfagianni |
idfc0791845 | missing | xha | keuter |
i2396609097 | no first name | NA | boulboulle |
i855e2e93d1 | no first name | NA | groot |
i32b061d54c | missing | mingming | hu |
i017c5e4634 | no first name | NA | rippe |
ic8f967bb21 | no first name | NA | haro |
ic0a164704c | missing | thin-thin | aye |
i23873be40f | no first name | NA | pichon |
i5be3187b98 | no first name | NA | lentz |
ic379d326ce | no first name | NA | meijer |
id30fbb7921 | no first name | NA | adriaans |
ifff399d2ee | missing | helwi | blom |
i500c3ce282 | missing | biswadjiet | harhangi |
i95a7a2cf3c | missing | pingpin | zheng |
i92da9535b0 | no first name | NA | stuyt |
i365aee5328 | no first name | NA | tran |
iec1043d22b | missing | yaite | cuesta |
i13167a417b | no first name | NA | beninca |
i03802031d2 | no first name | NA | grosman |
i919d72639a | no first name | NA | boer |
ibbfc82e6d8 | missing | hurria | yassin |
ib053181da0 | no first name | NA | carreno |
ia3f1e6b870 | missing | domine | leenaerts |
i062721a87b | no first name | NA | baat |
i254b51f5eb | no first name | NA | dresen |
i47b7b8c29a | no first name | NA | waal |
if61edf96b7 | no first name | NA | haeseryn |
icc2c971d46 | no first name | NA | bos |
i4896b3ba49 | no first name | NA | schoor |
i7ea48ce7c0 | no first name | NA | janssen |
i587edf44c9 | no first name | NA | timmermans |
i07b823dfc9 | no first name | NA | donnelly |
i2e131dab7b | no first name | NA | hustinx |
iab9272d786 | no first name | NA | valk |
i9c5c2fbe38 | no first name | NA | jacobs |
i18c2f3a946 | no first name | NA | kunze |
ia6b48c6a5a | no first name | NA | halim |
i07dfacdb71 | no first name | NA | sedelaar |
i23ba6238b8 | missing | vefie | poels |
ifbe87b4152 | no first name | NA | doornbos |
i580aa75800 | missing | sasker | vries |
i8bca52cc69 | missing | cornells | albers |
i9296455681 | no first name | NA | dooren |
i816c7b64c9 | no first name | NA | zaccaria |
i82b4e6e6e8 | no first name | NA | wyczesany |
ib4595b4755 | no first name | NA | haak |
i674e041638 | no first name | NA | alghamdi |
id49d89e377 | missing | ekkes | bruck |
ic303aa14f4 | no first name | NA | berg |
i424b1cf68f | no first name | NA | marx |
i2966e95dbe | no first name | NA | ellenberger |
i20a6fbe13c | no first name | NA | brederode |
id470d19022 | no first name | NA | dorleijn |
i544042ca72 | no first name | NA | koelma |
i945d1ba6ea | no first name | NA | gevers |
i743b1265ba | no first name | NA | rooij |
if336747471 | no first name | NA | verhoeven |
ice813ec177 | no first name | NA | olbertz |
iab3cc84795 | no first name | NA | boersma |
i408eb690bd | no first name | NA | pennings |
id2d7b8a637 | missing | karll | leeuw |
ia47d509408 | missing | guidoo | snel |
ib1b323cf66 | no first name | NA | vossen |
i889a00fef6 | missing | carolinee | wagner |
i9ffc2c4053 | no first name | NA | majdandzic |
ib275c1fa86 | no first name | NA | westbroek |
iba37a54bc2 | no first name | NA | kleijnen |
i9cfd208d7c | no first name | NA | steeg |
ib0c2091559 | no first name | NA | mulckhuijse |
i94896edf43 | no first name | NA | acarturk |
i3f1b244c1a | no first name | NA | wijk |
i8288409602 | no first name | NA | rosenthal |
Okay, so I conclude:
We use the above in our data/methods section where we discuss our gender variable.
df_ppf <- df_ppf %>%
left_join(df_gender)
df_ppf$time <- df_ppf$pub_year - df_ppf$phd_year
df_ppf$covid <- as.numeric(df_ppf$pub_year == 2020 | df_ppf$pub_year == 2021)
df_ppf$covid2020 <- as.numeric(df_ppf$pub_year == 2020)
df_ppf$covid2021 <- as.numeric(df_ppf$pub_year == 2021)
df_ppf$c2005 <- as.numeric(df_ppf$phd_year > 2005)
df_ppf$c2010 <- as.numeric(df_ppf$phd_year > 2010)
df_ppf$c2015 <- as.numeric(df_ppf$phd_year > 2015)
df_ppf$phd_year0 <- df_ppf$phd_year - 1990
df_ppf$stem <- ifelse((df_ppf$field == "Biological and Health Sciences" | df_ppf$field == "Physical and Mathematical Sciences" |
df_ppf$field == "Engineering" | df_ppf$field == "Agricultural Sciences"), "STEM-M", ifelse(df_ppf$field ==
"missing", "missing", "NON-STEM-M"))
df_ppf$ethnicity <- as.factor(df_ppf$ethnicity)
df_ppf$ethnicity <- relevel(df_ppf$ethnicity, 2)
# levels(df_ppf$ethnicity)
df_ppf$multidisc <- 1 - (df_ppf$health_domain^2 + df_ppf$life_domain^2 + df_ppf$physical_domain^2 + df_ppf$social_domain^2)
How do the Covid-years relate to career age
table(df_ppf$time, df_ppf$covid)
#>
#> 0 1
#> 1 5768 0
#> 2 6579 265
#> 3 6628 661
#> 4 6737 827
#> 5 6653 842
#> 6 6358 881
#> 7 5907 1002
#> 8 5544 1025
#> 9 5203 939
#> 10 4776 876
#> 11 4342 847
#> 12 3942 826
#> 13 3593 762
#> 14 3306 649
#> 15 3005 555
#> 16 2705 508
#> 17 2425 499
#> 18 2187 484
#> 19 1965 464
#> 20 1760 424
#> 21 1574 377
#> 22 1352 373
#> 23 1165 370
#> 24 987 366
#> 25 814 350
#> 26 664 320
#> 27 479 320
#> 28 374 261
#> 29 271 208
#> 30 97 218
#> 31 111 107
#> 32 107 0
To get an idea on which PhD cohorts are likely to have young children
(age under 5) we linked survey data among Dutch PhDs performed by
Statistics Netherlands in 2014 and 2019 (‘Gepromoveerdenonderzoek 2014
and 2019’ (Maas et al. 2014; Thor and Perez
2014)) to register data of Statistics Netherlands. The register
data of Statistics Netherlands is not publicly available and we
therefore give the raw data of the output table. This forms the basis
for Appendix 1.
childdf <- data.frame(cohort = 1990:2018, child5 = NA, N = NA)
childdf$child5 = c(0, 0.022, 0.008, 0.014, 0.022, 0.024, 0, 0.008, 0.016, 0.037, 0.032, 0.044, 0.06,
0.052, 0.083, 0.07, 0.16, 0.233, 0.271, 0.279, 0.352, 0.426, 0.461, 0.497, 0.53, 0.397, 0.5, 0.413,
0.336)
childdf$N = c(30, 89, 119, 148, 136, 127, 115, 132, 186, 162, 158, 205, 233, 210, 254, 227, 256, 288,
284, 337, 341, 319, 343, 296, 166, 174, 198, 172, 110)
# mean(childdf$N)
fit.lo <- loess(childdf$child5 ~ childdf$cohort, family = "symmetric", weigths = testdf$N, degree = 2,
span = 0.6)
childdf$smooth5 <- fitted(fit.lo)
# fshowdf(childdf)
ggplot(data = childdf, aes(x = cohort, y = child5, group = 1)) + geom_line(aes(x = cohort, y = smooth5,
group = 1)) + geom_point(color = "red", size = childdf$N/100) + labs(x = "PhD-cohort", y = "proportion with children under 5",
caption = "Source: Phd Survey 2014 and 2019 linked to Register data of Statistics Netherlands \nNotes: Size of points is proportional to number of observations. Mean N per cohort is 200; Smooth line created with loess.") +
scale_x_continuous(breaks = seq(1990, 2020, by = 5)) + theme(plot.caption = element_text(hjust = 0))
Appendix 1. Proportion of scholars within each PhD-cohort with at least one child aged under 5 in 2020
df_phd <- df_ppf %>%
mutate(id.dup = ifelse(duplicated(id), 1, 0)) %>%
filter(id.dup == 0) #phds for descriptives
# do we need to filter on time>1 & time<32? For now, we don't.
Note that I remove those without a domain. This removes 15 scholars.
df_phd_des <- df_phd %>%
dplyr::select("npubs_t", "npubs_a_t", "npubs_first_a_t", "npubs_mid_a_t", "npubs_last_a_t", "phd_year",
"gender2", "c2005", "ethnicity", "uni", "npubs_domain", "health_domain", "life_domain", "physical_domain",
"social_domain", "multidisc") %>%
dummy_cols(select_columns = c("gender2", "ethnicity", "uni")) %>%
dplyr::select(!c("gender2", "ethnicity", "uni")) %>%
na.omit()
Table1 <- df_phd_des %>%
describe()
Table1 <- as.data.frame(Table1)[, c(3, 4, 5, 8, 9)]
rownames(Table1) <- c("all output", "all articles", "first authored articles", "mid position authored articles",
"last authored articles", "PhD-cohort", "PhD after 2005", "output per domain", "domain: Health",
"domain: Life", "domain: Physical", "domain: Social", "multidisciplinarity", "gender: men", "gender: women",
"gender: no first name", "gender: missing", "ethnicity: native Dutch", "ethnicity: 'traditional' minority",
"ethnicity: other minority", "ethnicity: missing", "university: EUR", "university: LU", "university: RU",
"university: RUG", "university: TUD", "university: TUE", "university: TI", "university: UM", "university: UT",
"university: UU", "university: UvA", "university: VU", "university: WUR")
# fsave(Table1, 'Table1_raw')
Table1 <- Table1[c(1:7, 14:21, 9:12, 22:34), ]
Table1 <- cbind(rownames(Table1), Table1)
tableft <- flextable(Table1) %>%
set_header_labels(values = c(" ", "mean/prop.", "sd", "median", "min", "max")) %>%
# set_caption( 'Descriptive statistics at Phd-level (N = 8.303') %>%
width(j = 1, width = 2) %>%
align(i = 1, align = "center", part = "header") %>%
colformat_double(j = c("min", "max"), digits = c(0), big.mark = "") %>%
colformat_double(j = c("mean", "sd", "median"), digits = c(3), big.mark = "") %>%
colformat_double(i = c("PhD-cohort"), j = c("mean", "median"), digits = c(0), big.mark = "") %>%
set_table_properties(layout = "autofit") %>%
footnote(i = 6, j = 1, value = as_paragraph(c("The smallest PhD-cohort is 1992 and consists of 70 men and 23 women. For a complete overview of the size of each cohort see our replication website.")),
ref_symbols = c("a"), part = "body")
tableft
At the request of an anonymous reviewer, we provide the number of men and women in each Phd-cohort.
phd_cohort <- unique(df_phd$phd_year)[order(unique(df_phd$phd_year))]
N_tot <- as.numeric(table(df_phd$phd_year))
N_men <- as.numeric(table(df_phd$phd_year[df_phd$gender2 == "men"]))
N_women <- as.numeric(table(df_phd$phd_year[df_phd$gender2 == "women"]))
df_cohort <- data.frame(phd_cohort = phd_cohort, N_tot = N_tot, N_men = N_men, N_women = N_women)
Ncohort <- flextable(df_cohort) %>%
colformat_double(digits = c(0), big.mark = "") #%>%
# set_caption( 'Number of men and women in each Phd cohort') # %>% save_as_docx( path =
# 'RR1_Ncohort.docx')
Ncohort
domain_gender <- df_phd %>%
dplyr::select("gender2", "health_domain", "life_domain", "physical_domain", "social_domain", "multidisc",
"c2005") %>%
na.omit() %>%
describeBy(group = "gender2")
domain_men <- domain_gender[[1]][2:7, 3:4]
domain_women <- domain_gender[[2]][2:7, 3:4]
domain_gender <- cbind(domain_men, domain_women)
# fsave(domain_gender, 'Appendix2_raw')
table(df_phd$gender2)
A2 <- domain_gender
#>
#> men women no first name missing
#> 4740 3488 57 18
rownames(A2) <- c("domain: Health", "domain: Life", "domain: Physical", "domain: Social", "multidisciplinarity",
"PhD after 2005")
A2 <- cbind(rownames(A2), A2)
colnames(A2) <- c(" t", "mean", "sd", "mean1", "sd1")
A2ft <- flextable(A2, col_keys = c(" t", "mean", "sd", "col1", "mean1", "sd1")) %>%
width(j = "col1", width = 0.2) %>%
empty_blanks() %>%
set_header_labels(values = c(" ", "mean", "sd", "", "mean", "sd")) %>%
add_header_row(values = c("", "men \n(N=4.740)", "", "women \n(N=3.488)"), colwidths = c(1, 2, 1,
2)) %>%
width(j = 1, width = 2) %>%
# set_caption( 'Research domain by gender') %>%
width(j = 1, width = 2) %>%
align(i = 1, align = "center", part = "header") %>%
colformat_double(digits = c(3)) %>%
set_table_properties(layout = "autofit")
A2ft
Career age
cor.test(df_ppf$covid, df_ppf$time) #career age
#>
#> Pearson's product-moment correlation
#>
#> data: df_ppf$covid and df_ppf$time
#> t = 62.672, df = 113982, p-value < 2.2e-16
#> alternative hypothesis: true correlation is not equal to 0
#> 95 percent confidence interval:
#> 0.1768973 0.1881212
#> sample estimates:
#> cor
#> 0.1825152
Period
cor.test(df_ppf$covid, df_ppf$pub_year) #period
#>
#> Pearson's product-moment correlation
#>
#> data: df_ppf$covid and df_ppf$pub_year
#> t = 157.03, df = 113982, p-value < 2.2e-16
#> alternative hypothesis: true correlation is not equal to 0
#> 95 percent confidence interval:
#> 0.4169515 0.4264971
#> sample estimates:
#> cor
#> 0.421736
…and wat if we filter out times without covid.
df_ppf2 <- df_ppf[df_ppf$time > 1 & df_ppf$time < 32, ]
cor.test(df_ppf2$covid, df_ppf2$time) #career age
cor.test(df_ppf2$covid, df_ppf2$pub_year) #period
#>
#> Pearson's product-moment correlation
#>
#> data: df_ppf2$covid and df_ppf2$time
#> t = 54.634, df = 108107, p-value < 2.2e-16
#> alternative hypothesis: true correlation is not equal to 0
#> 95 percent confidence interval:
#> 0.1581100 0.1697117
#> sample estimates:
#> cor
#> 0.1639165
#>
#>
#> Pearson's product-moment correlation
#>
#> data: df_ppf2$covid and df_ppf2$pub_year
#> t = 155.71, df = 108107, p-value < 2.2e-16
#> alternative hypothesis: true correlation is not equal to 0
#> 95 percent confidence interval:
#> 0.4231231 0.4328612
#> sample estimates:
#> cor
#> 0.4280046
df_pubs <- df_pubs %>%
filter(id %in% df_phd$id)
nrow(df_pubs) #405920
#> [1] 405920
df_pubs %>%
ungroup() %>%
distinct(Titel, .keep_all = TRUE) %>%
nrow() #308181
#> [1] 308181
df_ppf <- df_ppf %>%
filter(id %in% df_phd$id)
nrow(df_ppf) #113984
#> [1] 113984
length(unique(df_ppf$id))
#> [1] 8303
Following the suggestion of the reviewer, we also present figure 1 for each gender seperately.
df_ppf %>%
group_by(pub_year, phd_year) %>%
summarize(fr = sum(npubs, na.rm = TRUE), naut = n(), nauthors = length(unique(id))) -> data_npubs_aggyear
df_ppf %>%
filter(gender2 == "men") %>%
group_by(pub_year, phd_year) %>%
summarize(fr = sum(npubs, na.rm = TRUE), naut = n(), nauthors = length(unique(id))) -> data_npubs_aggyear_m
df_ppf %>%
filter(gender2 == "women") %>%
group_by(pub_year, phd_year) %>%
summarize(fr = sum(npubs, na.rm = TRUE), naut = n(), nauthors = length(unique(id))) -> data_npubs_aggyear_w
df_ppf %>%
group_by(pub_year) %>%
summarize(fr = sum(npubs, na.rm = TRUE), naut = n(), nauthors = length(unique(id))) -> data_npubs_aggyear2
Figure1 <- ggplot(data_npubs_aggyear, aes(x = pub_year, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + labs(color = "Phd Cohort", x = "year", y = "number of publications") + scale_y_continuous(limits = c(0,
10)) + scale_x_continuous(limits = c(1990, 2024)) + theme_minimal() + theme(plot.background = element_rect(colour = "black",
fill = NA, size = 1))
Figure1
Figure1_m <- ggplot(data_npubs_aggyear_m, aes(x = pub_year, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + labs(color = "Phd Cohort", x = "year", y = "number of publications") + scale_y_continuous(limits = c(0,
10)) + scale_x_continuous(limits = c(1990, 2024)) + theme_minimal() + theme(plot.background = element_rect(colour = "black",
fill = NA, size = 1))
Figure1_m
Figure1_w <- ggplot(data_npubs_aggyear_w, aes(x = pub_year, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + labs(color = "Phd Cohort", x = "year", y = "number of publications") + scale_y_continuous(limits = c(0,
10)) + scale_x_continuous(limits = c(1990, 2024)) + theme_minimal() + theme(plot.background = element_rect(colour = "black",
fill = NA, size = 1))
Figure1_w
Figure1 <- ggplot(data_npubs_aggyear, aes(x = pub_year, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + labs(color = "Phd Cohort", x = "year", y = "number of publications") + scale_y_continuous(limits = c(0,
10)) + scale_x_continuous(limits = c(1990, 2024)) + theme_minimal() + theme(plot.margin = margin(t = 1,
r = 1, b = 1, l = 1, unit = "cm"))
# theme(plot.background = element_rect(colour='black', fill=NA, size=1))
Figure1_m <- ggplot(data_npubs_aggyear_m, aes(x = pub_year, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + labs(color = "Phd Cohort", x = "year", y = "number of publications") + scale_y_continuous(limits = c(0,
10)) + scale_x_continuous(limits = c(1990, 2024)) + theme_minimal() + theme(legend.position = "none") +
theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
Figure1_w <- ggplot(data_npubs_aggyear_w, aes(x = pub_year, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + labs(color = "Phd Cohort", x = "year", y = "number of publications") + scale_y_continuous(limits = c(0,
10)) + scale_x_continuous(limits = c(1990, 2024)) + theme_minimal() + theme(legend.position = "none") +
theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
Figure1_revision <- ggarrange(Figure1, ggarrange(Figure1_m, Figure1_w, ncol = 2, labels = c("men", "women"),
hjust = c(-2.5, -1.5)), nrow = 2, labels = "total", hjust = -2.5, common.legend = TRUE, legend = "right")
Figure1_revision
Figure 1. Mean publications per author per year and PhD-cohort
# ggexport(Figure1_revision, filename = './data/processed/20250531Figure1_rev.pdf') { png(file =
# './data/processed/20250531Figure1_rev.png', width = 1600, height = 1600, units = 'px', res = 200)
# Figure1_revision } dev.off() # # ggexport(Figure1_revision, filename =
# './data/processed/20250531figure1_rev.png', width = 1600, height=800, res=300, pointsize = 8)
df_ppf %>%
group_by(time, phd_year) %>%
summarize(fr = sum(npubs, na.rm = TRUE), naut = n(), nauthors = length(unique(id)), covid = first(covid),
) -> data_npubs_aggyear
data_covid <- data_npubs_aggyear[data_npubs_aggyear$covid == 1, ]
# ggplot(data_npubs_aggyear, aes(x=time, y=fr, group=phd_year, color=as.factor(phd_year))) +
# geom_line()
Figure2 <- ggplot(data_npubs_aggyear, aes(x = time, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + geom_point(data = data_covid, size = 1, show.legend = FALSE) + labs(color = "Phd Cohort",
x = "career age", y = "number of publications", caption = "Note: Points refer to the COVID-19 years") +
scale_y_continuous(limits = c(0, 10)) + theme_minimal() + theme(plot.background = element_rect(colour = "black",
fill = NA, size = 1), plot.caption = element_text(hjust = 0))
# fsave(Figure2, 'Figure2')
Figure2
It looks like older phd_years publish more at same career age. We have to realize however that these are only active scholars. Thus a selection on survivors. We need to control for this.
df_ppf %>%
filter(gender2 == "men") %>%
group_by(time, phd_year) %>%
summarize(fr = sum(npubs, na.rm = TRUE), naut = n(), nauthors = length(unique(id)), covid = first(covid),
) -> data_npubs_aggyear_m
data_covid_m <- data_npubs_aggyear_m[data_npubs_aggyear_m$covid == 1, ]
# ggplot(data_npubs_aggyear, aes(x=time, y=fr, group=phd_year, color=as.factor(phd_year))) +
# geom_line()
Figure2_m <- ggplot(data_npubs_aggyear_m, aes(x = time, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + geom_point(data = data_covid_m, size = 1, show.legend = FALSE) + labs(color = "Phd Cohort",
x = "career age", y = "number of publications", caption = "Note: Points refer to the COVID-19 years") +
scale_y_continuous(limits = c(0, 10)) + theme_minimal() + theme(plot.background = element_rect(colour = "black",
fill = NA, size = 1), plot.caption = element_text(hjust = 0))
# fsave(Figure2, 'Figure2')
Figure2_m
df_ppf %>%
filter(gender2 == "women") %>%
group_by(time, phd_year) %>%
summarize(fr = sum(npubs, na.rm = TRUE), naut = n(), nauthors = length(unique(id)), covid = first(covid),
) -> data_npubs_aggyear_w
data_covid_w <- data_npubs_aggyear_w[data_npubs_aggyear_w$covid == 1, ]
# ggplot(data_npubs_aggyear, aes(x=time, y=fr, group=phd_year, color=as.factor(phd_year))) +
# geom_line()
Figure2_w <- ggplot(data_npubs_aggyear_w, aes(x = time, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + geom_point(data = data_covid_w, size = 1, show.legend = FALSE) + labs(color = "Phd Cohort",
x = "career age", y = "number of publications", caption = "Note: Points refer to the COVID-19 years") +
scale_y_continuous(limits = c(0, 10)) + theme_minimal() + theme(plot.background = element_rect(colour = "black",
fill = NA, size = 1), plot.caption = element_text(hjust = 0))
# fsave(Figure2, 'Figure2')
Figure2_w
Figure2 <- ggplot(data_npubs_aggyear, aes(x = time, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + geom_point(data = data_covid, size = 1, show.legend = FALSE) + labs(color = "Phd Cohort",
x = "career age", y = "number of publications") + scale_y_continuous(limits = c(0, 10)) + theme_minimal()
theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
Figure2_m <- ggplot(data_npubs_aggyear_m, aes(x = time, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + geom_point(data = data_covid_m, size = 1, show.legend = FALSE) + labs(color = "Phd Cohort",
x = "career age", y = "number of publications") + scale_y_continuous(limits = c(0, 10)) + theme_minimal() +
theme(legend.position = "none") + theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
Figure2_w <- ggplot(data_npubs_aggyear_w, aes(x = time, y = fr/nauthors, group = phd_year, color = as.factor(phd_year))) +
geom_line() + geom_point(data = data_covid_w, size = 1, show.legend = FALSE) + labs(color = "Phd Cohort",
x = "career age", y = "number of publications") + scale_y_continuous(limits = c(0, 10)) + theme_minimal() +
theme(legend.position = "none") + theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
Figure2_revision <- ggarrange(Figure2, ggarrange(Figure2_m, Figure2_w, ncol = 2, labels = c("men", "women"),
hjust = c(-2.5, -1.5)), nrow = 2, labels = "total", hjust = -2.5, common.legend = TRUE, legend = "right")
Figure2_revision <- annotate_figure(Figure2_revision, bottom = text_grob("Note: Points refer to the COVID-19 years",
color = "black", just = "left", x = 0.05, y = 1.4, size = 8, lineheight = 0.6))
Figure2_revision
Figure 2. Mean publications per author by career age and PhD-cohort
# fsave(Figure2_revision, file='Figure2_revision.rda') ggexport(Figure2_revision, filename =
# './data/processed/20250531Figure2_rev.pdf') { png(file =
# './data/processed/20250531Figure2_rev.png', width = 1600, height = 1600, units = 'px', res = 200)
# Figure2_revision } dev.off()
# ggexport(Figure1_revision, filename = './data/processed/figure1.png', width = 1600, height=800,
# res=300, pointsize = 8)
#> List of 1
#> $ plot.margin: 'margin' num [1:4] 1cm 1cm 1cm 1cm
#> ..- attr(*, "unit")= int 1
#> - attr(*, "class")= chr [1:2] "theme" "gg"
#> - attr(*, "complete")= logi FALSE
#> - attr(*, "validate")= logi TRUE
We will determine the best fitting distribution for count data. We use as main dependent variable total publications, because this one is most skewed.
We see quite some zeros for publication years. We may need to take this into account. There are three approaches:
and/or:
I quote from stackoverflow:
Hurdle models assume 2 types of subjects: (1) those who never experience the outcome and (2) those who always experience the outcome at least once. Zero-inflated models conceptualize subjects as (1) those who never experience the outcome and (2) those who can experience the outcome but don’t always.
Thus suppose we also include PhDs who become inactive. Once inactive (off state) they cannot experience the outcome (one or more pubs) anymore. (the on states means publish once or more). But we also have PhDs who don’t publish (off-state) but are still ‘active’, that is, working in academia. In the active state (on state) they could publish but not necessarily do. Thus if we would want to use one of the above it should be zero-inflated I guess.
Lets see what gamlss comes up with.
table(df_ppf$npubs, useNA = "always")
# k=2 means AIC
fitnpubs <- fitDist(df_ppf$npubs, type = "counts", try.gamlss = TRUE, parallel = "snow", ncpus = 10,
k = 2)
# fsave(fitnpubs, 'fitnpubs')
fitnpubs$fits[order(fitnpubs$fits)]
#> LG ZIPF ZABNB WARING BNB ZIBNB GPO ZASICHEL ZISICHEL ZIPIG ZAPIG
#> 418981.9 450921.4 542076.4 542087.0 542088.1 542090.1 542278.9 542339.2 542339.2 542400.6 542400.6
#> SI SICHEL ZANBI DEL PIG NBI NBII NBF ZINBI ZINBF ZINBF
#> 542512.4 542512.4 542841.7 542883.2 543582.6 543881.7 543881.7 543883.7 543883.7 543885.7 543885.7
#> GEOM GEOMo ZALG DPO ZAZIPF YULE ZIP2 ZAP ZIP PO
#> 546883.8 546883.8 548569.8 550768.6 580509.3 585972.0 733889.3 733889.3 733889.3 845427.6
Commonly, count variables are analysed with a Negative Binomial distribution (as improvement over the Poisson distribution). We observe that the Beta Negative Binomial (an NB that can deal better with overdispersion) fits substantially better. If we disregard the zero-inflated and zero-adjusted models only the LG distribution is better than the BNB. Given the nice interpretation of parameters I favor the BNB. In robustness checks we also analyze a logaritmically transformed output variable, leading to similar conclusions.
first some descriptives
df_ppf_sel <- df_ppf %>%
filter(gender2 == "men" | gender2 == "women")
describe(df_ppf_sel$npubs)
describeBy(df_ppf_sel$npubs, group = df_ppf_sel$gender2)
#> vars n mean sd median trimmed mad min max range skew kurtosis se
#> X1 1 112837 3.57 5.15 2 2.56 2.97 0 114 114 4.41 42.87 0.02
#>
#> Descriptive statistics by group
#> group: men
#> vars n mean sd median trimmed mad min max range skew kurtosis se
#> X1 1 70825 4.01 5.67 2 2.9 2.97 0 114 114 4.14 35.95 0.02
#> ---------------------------------------------------------------------------
#> group: women
#> vars n mean sd median trimmed mad min max range skew kurtosis se
#> X1 1 42012 2.84 4.03 2 2.06 2.97 0 109 109 4.78 63.36 0.02
#> ---------------------------------------------------------------------------
#> group: no first name
#> NULL
#> ---------------------------------------------------------------------------
#> group: missing
#> NULL
Are outliers real?
df_ppf_sel[df_ppf_sel$npubs == max(df_ppf_sel$npubs), ]$id
tdf_pubs <- df_pubs[df_pubs$id == df_ppf_sel[df_ppf_sel$npubs == max(df_ppf_sel$npubs), ]$id, ]
fshowdf(tdf_pubs)
#> [1] "i8a16306b35"
Titel | Gepubliceerd.in | Auteur | Date.issued | Type | person_id | DOI | Titel_ori | pub_year | id | prs | hasprofile | start_pub | auteur | firstname | ini | lastname | gender | gender_2 | ethnicity | ethnicity2 | ethnicity3 | field | uni | phd_year | degree.supervisor | promotor | diss_url.x | diss_url.y | person_id2 | person_id3 | person_id4 | person_id5 | dupid | duplicateDOI | firstpub | lastpub | covidpub | aut_pot | aut_max | aut_code |
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
searchfordarkmatterinassociationwi | Journal of High Energy Physics, 2021, 1 - 45. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2021)226 | Search for dark matter in association with an energetic photon in pp collisions at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementsoftop-quarkpairsingle-a | Journal of High Energy Physics, 1 - 76. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2021)033 | Measurements of top-quark pair single- and double-differential cross-sections in the all-hadronic channel in pp collisions at √s = 13 TeV using the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
studyofthenormalizedtransversemomen | Physical Review D, 103, 1 - 15. ISSN 2470-0010. | Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Agnew, J.P.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Zieminska, D.; Zivkovic, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.103.012003 | Study of the normalized transverse momentum distribution of W bosons produced in p¯p collisions at √s=1.96 TeV | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
asearchforthedimuondecayofthesta | Physics Letters B, 812, 1 - 24. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zhou, Y.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135980 | A search for the dimuon decay of the Standard Model Higgs boson with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofthejetmassinhightran | Physics Letters B, 812, 1 - 23. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zhou, Y.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135991 | Measurement of the jet mass in high transverse momentum Z(→bb¯¯)γ production at √s = 13 TeV using the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforphenomenabeyondthestandard | European Physical Journal C, 81, 1 - 29. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08730-0 | Search for phenomena beyond the Standard Model in events with large b-jet multiplicity using the ATLAS detector at the LHC | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofhadroniceventshapesin | Journal of High Energy Physics, 2021, 1 - 44. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2021)188 | Measurement of hadronic event shapes in high-pT multijet final states at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementsofwhandzhproductionin | The European Physical Journal C: Particles and Fields, 81, 1 - 41. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08677-2 | Measurements of WH and ZH production in the H→bb¯ decay channel in pp collisions at 13TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
medium-inducedmodificationofz-tagged | Physical Review Letters, 126, 1 - 20. ISSN 0031-9007. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.126.072301 | Medium-Induced Modification of Z-Tagged Charged Particle Yields in Pb+Pb Collisions at 5.02 TeV with the ATLAS Detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforsquarksandgluinosinfinal | Journal of High Energy Physics, 2021, 1 - 64. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2021)143 | Search for squarks and gluinos in final states with jets and missing transverse momentum using 139 fb−1 of of √s = 13 TeV pp collision data with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
differentialcross-sectionmeasurements | European Physical Journal C, 81, 1 - 42. ISSN 1434-6044. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08734-w | Differential cross-section measurements for the electroweak production of dijets in association with a Z boson in proton–proton collisions at ATLAS | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
erratumto:higgsbosonproductioncross | The European Physical Journal C: Particles and Fields, 81, 1 - 15. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08644-x | Erratum to: Higgs boson production cross-section measurements and their EFT interpretation in the 4ℓ decay channel at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
erratum:searchforthehh→b¯bb¯bproc | Journal of High Energy Physics, 2021, 1 - 19. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2021)145 | Erratum: Search for the HH → b¯bb¯b process via vector-boson fusion production using proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementoffiducialanddifferential | European Physical Journal C, 79, 1 - 34. ISSN 1434-6044. | Aaboud, M.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7371-6 | Measurement of fiducial and differential W+W- production cross-sections at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchesforelectroweakproductionofs | Physical Review D, 101, 1 - 46. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.101.052005 | Searches for electroweak production of supersymmetric particles with compressed mass spectra in √s = 13 TeV pp collisions with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofthez(→ℓ+ℓ−)γproduction | Journal of High Energy Physics, 1 - 52. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abde Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2020)054 | Measurement of the Z(→ ℓ+ℓ−)γ production cross-section in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofsoft-dropjetobservables | Physical Review D, 101, 1 - 37. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.101.052007 | Measurement of soft-drop jet observables in pp collisions with the ATLAS detector at √s = 13 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementsofinclusiveanddifferenti | Journal of High Energy Physics, 2020, 1 - 48. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Wu, M.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2020)049 | Measurements of inclusive and differential cross-sections of combined t¯tγ and tWγ production in the eµ channel at 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
dijetresonancesearchwithweaksupervi | Physical Review Letters, 125, 1 - 23. ISSN 0031-9007. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zhou, H.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.125.131801 | Dijet Resonance Search with Weak Supervision Using √s = 13 TeV pp Collisions in the ATLAS Detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
operationoftheatlastriggersystemin | Journal of Instrumentation, 15, 1-59. ISSN 1748-0221. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Bakos, E.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/10/p10004 | Operation of the ATLAS trigger system in Run 2 | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
performanceoftheatlasmuontriggersi | Journal of Instrumentation, 15, 1 - 58. ISSN 1748-0221. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Bakos, E.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/09/p09015 | Performance of the ATLAS muon triggers in Run 2 | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchfordirectproductionofelectrow | Journal of High Energy Physics, 1 - 46. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2020)005 | Search for direct production of electroweakinos in final states with missing transverse momentum and a Higgs boson decaying into photons in pp collisions at root s=13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
studiesofx(3872)andψ(2s)production | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 102, 1 - 14. ISSN 1550-7998. | Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Agnew, J.P.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Zieminska, D.; Zivkovic, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.102.072005 | Studies of X(3872) and ψ(2S) production in p(p)over-bar collisions at 1.96 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
erratumto:measurementofdifferential | Journal of High Energy Physics, 2020, 1 - 20. ISSN 1029-8479. | Aad, G.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.F.; Igonkina, O.B.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2020)048 | Erratum to: Measurement of differential cross sections and W+/W− cross-section ratios for W boson production in association with jets at at √s = 8 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthett¯productioncross- | Physics Letters B, 810, 1 - 22. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135797 | Measurement of the tt¯ production cross-section in the lepton+jets channel at √s = 13 TeV with the ATLAS experiment | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementsofthehiggsbosoninclusiv | European Physical Journal C, 80, 1 - 67. ISSN 1434-6044. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-8223-0 | Measurements of the Higgs boson inclusive and differential fiducial cross sections in the 4ℓ decay channel at √{s } = 13 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfornewphenomenainfinalstates | Journal of High Energy Physics, 2020, 1 - 53. ISSN 1029-8479. | Aaboud, M.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2020)062 | Search for new phenomena in final states with large jet multiplicities and missing transverse momentum using √s = 13 TeV proton-proton collisions recorded by ATLAS in Run 2 of the LHC | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchfort¯tresonancesinfullyhadro | Journal of High Energy Physics, 2020, 1 - 43. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2020)061 | Search for t¯t resonances in fully hadronic final statess in fully hadronic final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
volumei.introductiontodune:executiv | Journal of Instrumentation, 15, 2 - 21. ISSN 1748-0221. | Abi, B.; Filthaut, F.; Miedema, T. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/08/t08008 | Volume I. Introduction to DUNE: Executive summary | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 3 | (1.1) one exact match |
asearchforthezγdecaymodeofthehi | Physics Letters B, 809, 1 - 21. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135754 | A search for the Zγ decay mode of the Higgs boson in pp collisions at √s=13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchforpairsofscalarleptoquarksd | Journal of High Energy Physics, 1 - 45. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2020)112 | Search for pairs of scalar leptoquarks decaying into quarks and electrons or muons in √s = 13 TeV pp collisions with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
firstresultsonprotodune-spliquidarg | Journal of Instrumentation, 15, 1 - 100. ISSN 1748-0221. | Abi, B.; Abud, A.Abed; Acciarri, R.; Filthaut, F.; Miedema, T.; Zutshi, V.; Zwaska, R. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/12/p12004 | First results on ProtoDUNE-SP liquid argon time projection chamber performance from a beam test at the CERN Neutrino Platform | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 7 | (1.1) one exact match |
determinationofjetcalibrationandene | The European Physical Journal C: Particles and Fields, 80, 1 - 81. ISSN 1434-6052. | Aaboud, M.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08477-8 | Determination of jet calibration and energy resolution in proton–proton collisions at √s =8 TeV using the using the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
erratum:measurementofangularandmome | Physical Review C, 101, 1 - 1. ISSN 2469-9985. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.101.059903 | Erratum: Measurement of angular and momentum distributions of charged particles within and around jets in Pb+Pb and pp collisions at √sNN = 5.02 TeV with the ATLAS detector [Phys. Rev. C 100, 064901 (2019)] | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforheavyresonancesdecayingint | Physical Review Letters, 125, 1 - 20. ISSN 0031-9007. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.125.251802 | Search for Heavy Resonances Decaying into a Photon and a Hadronically Decaying Higgs Boson in pp Collisions at √s=13 TeV with the ATLAS Detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchforhiggsbosondecaysintotwon | Physical Review D, 102, 1 - 28. ISSN 2470-0010. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.102.112006 | Search for Higgs boson decays into two new low-mass spin-0 particles in the 4b channel with the ATLAS detector using pp collisions at √s = 13 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforheavydibosonresonancesins | The European Physical Journal C: Particles and Fields, 80, 1 - 41. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08554-y | Search for heavy diboson resonances in semileptonic final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
observationandmeasurementofforwardp | Physical Review Letters, 125, 1 - 21. ISSN 0031-9007. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.125.261801 | Observation and Measurement of Forward Proton Scattering in Association with Lepton Pairs Produced via the Photon Fusion Mechanism at ATLAS | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforresonancesdecayingintoawe | Physical Review D, 102, 1 - 27. ISSN 2470-0010. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.102.112008 | Search for resonances decaying into a weak vector boson and a Higgs boson in the fully hadronic final state produced in proton - proton collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
alignmentoftheatlasinnerdetectorin | European Physical Journal C, 80, 1 - 41. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Moskvitina, P.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08700-6 | Alignment of the ATLAS Inner Detector in Run 2 | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofthelundjetplaneusing | Physical Review Letters, 124, 1 - 21. ISSN 0031-9007. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.124.222002 | Measurement of the Lund Jet Plane Using Charged Particles in 13 TeV Proton-Proton Collisions with the ATLAS Detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
atlasdataqualityoperationsandperfor | Journal of Instrumentation, 15, 1 - 43. ISSN 1748-0221. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/04/p04003 | ATLAS data quality operations and performance for 2015-2018 data-taking | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
demonstrationofcoolingbythemuonion | Nature, 578, 53 - 59. ISSN 0028-0836. | Bogomilov, M.; Filthaut, F.; Heidt, C.; et al., | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1038/s41586-020-1958-9 | Demonstration of cooling by the Muon Ionization Cooling Experiment | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 4 | (1.1) one exact match |
testofcpinvarianceinvector-bosonfu | Physics Letters B, 805, 1 - 25. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135426 | Test of CP invariance in vector-boson fusion production of the Higgs boson in the H → ττ channel in proton–proton collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
cppropertiesofhiggsbosoninteraction | Physical Review Letters, 125, 1 - 21. ISSN 0031-9007. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.125.061802 | CP Properties of Higgs Boson Interactions with Top Quarks in the t¯tH and tH Processes Using H→γγ with the ATLAS Detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforheavyhiggsbosonsdecayingi | Physical Review Letters, 125, 1 - 22. ISSN 0031-9007. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; Konig, A.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.125.051801 | Search for Heavy Higgs Bosons Decaying into Two Tau Leptons with the ATLAS Detector Using pp Collisions at √s =13 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforheavyneutralhiggsbosonspr | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 102, 1 - 31. ISSN 1550-7998. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.102.032004 | Search for heavy neutral Higgs bosons produced in association with b-quarks and decaying into b-quarks at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchforlong-lived,massiveparticles | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 102, 1 - 30. ISSN 1550-7998. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.102.032006 | Search for long-lived, massive particles in events with a displaced vertex and a muon with large impact parameter in pp collisions at √s =13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
combinationofthewbosonpolarization | Journal of High Energy Physics, 1 - 67. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2020)051 | Combination of the W boson polarization measurements in top quark decays using ATLAS and CMS data at √s = 8 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchfordijetresonancesineventswi | Journal of High Energy Physics, 2020, 1 - 42. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2020)151 | Search for dijet resonances in events with an isolated charged lepton using √s = 13 TeV proton-proton collision data collected by the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
measurementofthettproductioncross-s | European Physical Journal C, 80, 1 - 70. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Singh, S.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-7907-9 | Measurement of the tt production cross-section and lepton differential distributions in eμ dilepton events from pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchforlightlong-livedneutralpart | European Physical Journal C, 80, 1 - 28. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-7997-4 | Search for light long-lived neutral particles produced in pp collisions at √s =13 TeV and decaying into collimated leptons or light hadrons with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofazimuthalanisotropyofm | Physics Letters B, 807, 1 - 23. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135595 | Measurement of azimuthal anisotropy of muons from charm and bottom hadrons in Pb+Pb collisions at √sNN = 5.02 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofthetransversemomentumd | The European Physical Journal C: Particles and Fields, 80, 1 - 28. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-8001-z | Measurement of the transverse momentum distribution of Drell–Yan lepton pairs in proton–proton collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsoftheproductioncross-sec | Journal of High Energy Physics, 2020, 1 - 58. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2020)044 | Measurements of the production cross-section for a Z boson in association with b-jets in proton-proton collisions at √s= 13 TeVwith the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementsoftop-quarkpairspincorr | The European Physical Journal C: Particles and Fields, 80, 1 - 43. ISSN 1434-6052. | Aaboud, M.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-8181-6 | Measurements of top-quark pair spin correlations in the eμ channel at √s = 13 TeV using pp collisions in the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
observationoftheassociatedproduction | Journal of High Energy Physics, 2020, 1 - 46. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2020)124 | Observation of the associated production of a top quark and a Z boson in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
performanceofthemissingtransversemo | Journal of High Energy Physics, 2020, 1 - 53. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2020)080 | Performance of the missing transverse momentum triggers for the ATLAS detector during Run-2 data taking | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforascalarpartnerofthetopq | The European Physical Journal C: Particles and Fields, 80, 1 - 44. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-8102-8 | Search for a scalar partner of the top quark in the all-hadronic tt¯ plus missing transverse momentum final state at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforthehh→bb¯¯bb¯¯processvia | Journal of High Energy Physics, 2020, 1 - 37. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2020)108 | Search for the HH →bb¯¯bb¯¯ process via vector-boson fusion production using proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
erratumto:searchfordibosonresonance | Journal of High Energy Physics, 2020, 1 - 19. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2020)042 | Erratum to: Search for diboson resonances in hadronic final states in 139 fb−1 of pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfordisplacedverticesofopposit | Physics Letters B, 801, 1 - 21. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Castelijn, R.J.A.M.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.135114 | Search for displaced vertices of oppositely charged leptons from decays of long-lived particles in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchfornon-resonanthiggsbosonpair | Physics Letters B, 801, 1 - 22. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Castelijn, R.J.A.M.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.135145 | Search for non-resonant Higgs boson pair production in the bbl nu l nu final state with the ATLAS detector in pp collisions at √s = 13 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforthehiggsbosondecaysh->e | Physics Letters B, 801, 1 - 19. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Castelijn, R.J.A.M.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.135148 | Search for the Higgs boson decays H -> ee and H -> e mu in pp collisions at √s = 13TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforchargino-neutralinoproductio | Physical Review D, 101, 1 - 32. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.101.072001 | Search for chargino-neutralino production with mass splittings near the electroweak scale in three-lepton final states in √s = 13 TeV pp collisions with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchfornewresonancesinmassdistri | Journal of High Energy Physics, 1 - 41. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2020)145 | Search for new resonances in mass distributions of jet pairs using 139 fb(-1) of pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofisolated-photonplustwo- | Journal of High Energy Physics, 1 - 49. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2020)179 | Measurement of isolated-photon plus two-jet production in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofj/ψproductioninassocia | Journal of High Energy Physics, 1 - 38. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2020)095 | Measurement of J/ψ production in association with a W-+/- boson with pp data at 8 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
measurementoftheazimuthalanisotropy | Physical Review C, 101, 1 - 35. ISSN 2469-9985. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.101.024906 | Measurement of the azimuthal anisotropy of charged-particle production in Xe plus Xe collisions at √sNN = 5.44 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
fluctuationsofanisotropicflowinpb+p | Journal of High Energy Physics, 2020, 1 - 59. ISSN 1029-8479. | Aaboud, M.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2020)051 | Fluctuations of anisotropic flow in Pb+Pb collisions at √sNN = 5.02 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementofdifferentialcrosssectio | Journal of High Energy Physics, 2020, 1 - 37. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2020)042 | Measurement of differential cross sections for single diffractive dissociation in √s = 8 TeV pp collisions using the ATLAS ALFA spectrometer | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementoflong-rangetwo-particlea | The European Physical Journal C: Particles and Fields, 80, 1 - 32. ISSN 1434-6052. | Aaboud, M.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-7606-6 | Measurement of long-range two-particle azimuthal correlations in Z-boson tagged pp collisions at √s = 8 and 13 TeV | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
performanceofelectronandphotontrigg | The European Physical Journal C: Particles and Fields, 80, 1 - 41. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7500-2 | Performance of electron and photon triggers in ATLAS during LHC Run 2 | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchformagneticmonopolesandstable | Physical Review Letters, 124, 1 - 20. ISSN 0031-9007. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.124.031802 | Search for Magnetic Monopoles and Stable High-Electric-Charge Objects in 13 Tev Proton-Proton Collisions with the ATLAS Detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
transversemomentumandprocessdependen | European Physical Journal C, 80, 1 - 31. ISSN 1434-6044. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-7624-4 | Transverse momentum and process dependent azimuthal anisotropies in √sNN = 8.16 TeV p+Pb collisions with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
zbosonproductioninpb+pbcollisionsa | Physics Letters B, 802, 1 - 23. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135262 | Z boson production in Pb+Pb collisions at √sNN = 5.02 TeV measured by the ATLAS experiment | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchfordirectstauproductionineve | Physical Review D, 101, 1 - 30. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.101.032009 | Search for direct stau production in events with two hadronic τ-leptons in √s = 13 TeV pp collisions with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforelectroweakproductionofcha | European Physical Journal C, 80, 1 - 33. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7594-6 | Search for electroweak production of charginos and sleptons decaying into final states with two leptons and missing transverse momentum in √s = 13 TeV pp collisions using the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
higgsbosonproductioncross-sectionmea | European Physical Journal C, 80, 1 - 54. ISSN 1434-6044. | Aaboud, M.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-8227-9 | Higgs boson production cross-section measurements and their EFT interpretation in the 4l decay channel at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
erratum:measurementofdifferentialcro | Journal of High Energy Physics, 2020, 1 - 19. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2020)182 | Erratum: Measurement of differential cross sections for single diffractive dissociation in √s = 8 TeV pp collisions using the ATLAS ALFA spectrometer | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
long-baselineneutrinooscillationphysi | European Physical Journal C, 80, 1 - 34. ISSN 1434-6044. | Abi, B.; Acciarri, R.; Acero, M.A.; Adamov, G.; Adams, D.; Adinolfi, M.; Filthaut, F.; Henry, S.B.; Mariani, C.; Matthews, J.; Miedema, T.; Wu, W.T.; Zutshi, V.; Zwaska, R. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08456-z | Long-baseline neutrino oscillation physics potential of the DUNE experiment: DUNE Collaboration | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
neutrinointeractionclassificationwith | Physical Review D, 102, 1 - 20. ISSN 2470-0010. | Abi, B.; Acciarri, R.; Acero, M.A.; Adamov, G.; Adams, D.; Adinolfi, M.; Filthaut, F.; Henry, S.B.; Mariani, C.; Matthews, J.; Miedema, T.; Wu, W.T.; Zutshi, V.; Zwaska, R. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.102.092003 | Neutrino interaction classification with a convolutional neural network in the DUNE far detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchfornewnon-resonantphenomenain | Journal of High Energy Physics, 2020, 1 - 41. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; Nellist, C.J.M.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2020)005 | Search for new non-resonant phenomena in high-mass dilepton final states with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchfortopsquarksineventswitha | The European Physical Journal C: Particles and Fields, 80, 1 - 33. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08469-8 | Search for top squarks in events with a Higgs or Z boson using 139 fb−1 of pp collision data at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
evidencefortt¯tt¯productioninthemu | The European Physical Journal C: Particles and Fields, 80, 1 - 32. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08509-3 | Evidence for tt¯tt¯ production in the multilepton final state in proton–proton collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforhiggsbosondecaysintoazb | Physical Review Letters, 125, 1 - 22. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abed Abud, A.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.125.221802 | Search for Higgs Boson Decays into a Z Boson and a Light Hadronically Decaying Resonance Using 13 TeV pp Collision Data from the ATLAS Detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
performanceoftheupgradedpreprocessor | Journal of Instrumentation, 15, 1 - 48. ISSN 1748-0221. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, Nicolo de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; Konig, A.C.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/11/p11016 | Performance of the upgraded PreProcessor of the ATLAS Level-1 Calorimeter Trigger | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
erratumto:measurementsoftop-quarkpa | European Physical Journal C, 80, 1 - 23. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Abhayasinghe, D.K.; Aggarwal, A.; Caron, S.; Castelijn, R.J.A.M.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, N.; Igonkina, O.; Ilic, N.; König, A.C; Kremer, J.A; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-020-08541-3 | Erratum to: Measurements of top-quark pair differential and double-differential cross-sections in the l plus jets channel with pp collisions at root s=13 TeV using the ATLAS detector [Eur. Phys. J. C 79 (2019) 1028] | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 22 | (1.1) one exact match |
reconstructionandidentificationofboo | Journal of High Energy Physics, 2020, 1 - 47. ISSN 1126-6708. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2020)163 | Reconstruction and identification of boosted di-τ systems in a search for Higgs boson pairs using 13 TeV proton-proton collision data in ATLAS | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
evidenceforelectroweakproductionoft | Physics Letters B, 803, 1 - 23. ISSN 0370-2693. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2020.135341 | Evidence for electroweak production of two jets in association with a Zγ pair in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforlong-livedneutralparticles | Physical Review D, 101, 1 - 29. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.101.052013 | Search for long-lived neutral particles produced in pp collisions at √s = 13 TeV decaying into displaced hadronic jets in the ATLAS inner detector and muon spectrometer | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
combinationofsearchesforhiggsboson | Physics Letters B, 800, 1 - 23. ISSN 0370-2693. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Abhayasinghe, D.K.; Aggarwal, A.; Caron, S.; Castelijn, R.J.A.M.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.135103 | Combination of searches for Higgs boson pairs in pp collisions at √s = 13 TeV with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
combinedmeasurementsofhiggsbosonpro | Physical Review D, 101, 1 - 48. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.101.012002 | Combined measurements of Higgs boson production and decay using up to 80 fb(-1) of proton-proton collision data at √s = 13 TeV collected with the ATLAS experiment | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforflavour-changingneutralcurr | Physics Letters B, 800, 1 - 21. ISSN 0370-2693. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Abhayasinghe, D.K.; Aggarwal, A.; Caron, S.; Castelijn, R.J.A.M.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.135082 | Search for flavour-changing neutral currents in processes with one top quark and a photon using 81 fb(-1) of pp collisions at √s = 13 TeV with the ATLAS experiment | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchesforlepton-flavour-violatingde | Physics Letters B, 800, 1 - 25. ISSN 0370-2693. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Abhayasinghe, D.K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.135069 | Searches for lepton-flavour-violating decays of the Higgs boson in √s = 13 TeV pp collisions with the ATLAS detector | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
cross-sectionmeasurementsofthehiggs | Physical Review D, 99, 1 - 39. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.072001 | Cross-section measurements of the Higgs boson decaying into a pair of tau-leptons in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofthefour-leptoninvariant | Journal of High Energy Physics, 1 - 50. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2019)048 | Measurement of the four-lepton invariant mass spectrum in 13 TeV proton-proton collisions with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchforhiggsbosonpairproductioni | Journal of High Energy Physics, 1 - 50. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2019)092 | Search for Higgs boson pair production in the bb¯¯WW∗ decay mode at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchfortheproductionofalong-live | Physical Review Letters, 122, 1 - 19. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.122.151801 | Search for the Production of a Long-Lived Neutral Particle Decaying within the ATLAS Hadronic Calorimeter in Association with a Z Boson from pp Collisions at √s = 13 | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
studyoftheraredecaysofbs0andb- | Journal of High Energy Physics, 1 - 47. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2019)098 | Study of the rare decays of B s 0 and B-0 mesons into muon pairs using data collected during 2015 and 2016 with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementoftheratioofcrosssectio | Journal of High Energy Physics, 1 - 47. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Klein, M.; König, Adriaan; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2019)093 | Measurement of the ratio of cross sections for inclusive isolated-photon production in pp collisions at √s = 13 and 8 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
measurementofthephotonidentification | European Physical Journal C, 79, 1 - 41. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6650-6 | Measurement of the photon identification efficiencies with the ATLAS detector using LHC Run 2 data collected in 2015 and 2016 | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
propertiesofg→b¯batsmallopeningang | Physical Review D, 99, 1 - 26. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Alderweireldt, S.C.; Abeloos, B.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.052004 | Properties of g→b¯b at small opening angles in pp collisions with the ATLAS detector at √s = 13 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
searchforheavylong-livedmulticharged | Physical Review D. Particles and Fields, 99, 1 - 26. ISSN 0556-2821. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.052003 | Search for heavy long-lived multicharged particles in proton-proton collisions at root s=13 TeV using the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchforlong-livedparticlesproduced | Physical Review D, 99, 1 - 36. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.052005 | Search for long-lived particles produced in pp collisions at √s = 13 TeV that decay into displaced hadronic jets in the ATLAS muon spectrometer | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchforfour-top-quarkproductionin | Physical Review D, 99, 1 - 36. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Abhayasinghe, D.K.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.052009 | Search for four-top-quark production in the single-lepton and opposite-sign dilepton final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
firstparticle-by-particlemeasuremento | European Physical Journal C, 79, 1 - 15. ISSN 1434-6044. | Adams, D.; Adey, D.; Asfandiyarov, R.; Barber, G.; Bari, A. de; Bayes, R.; Filthaut, F.; Young, A.R.; Zisman, M. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6674-y | First particle-by-particle measurement of emittance in the Muon Ionization Cooling Experiment | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
measurementoftheinclusivecross-secti | European Physical Journal C, 79, 1 - 47. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Alderweireldt, S.; Besjes, G.J.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M.; Konig, A.C.; Pedraza Diaz, L.; Proklova, N.; Schouwenberg, J.F.P.; Strubig, A.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7321-3 | Measurement of the inclusive cross-section for the production of jets in association with a Z boson in proton-proton collisions at 8 TeV using the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 24 | (1.1) one exact match |
observationofelectroweakproductionof | Physical Review Letters, 123, 1 - 21. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Klein, M; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Proklova, N.; Nedden, M. Zur; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.123.161801 | Observation of Electroweak Production of a Same-Sign W Boson Pair in Association with Two Jets in pp Collisions at √s = 13 TeV with the ATLAS Detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
searchfordibosonresonancesinhadroni | Journal of High Energy Physics, 1 - 43. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Abidi, S.H.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2019)091 | Search for diboson resonances in hadronic final states in 139 fb(-1) of pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforexcitedelectronssinglyprod | European Physical Journal C, 79, 1 - 30. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7295-1 | Search for excited electrons singly produced in proton-proton collisions at √s = 13 TeV with the ATLAS experiment at the LHC | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
identificationofboostedhiggsbosonsd | European Physical Journal C, 79, 1 - 38. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7335-x | Identification of boosted Higgs bosons decaying into b-quark pairs with the ATLAS detector at 13 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
evidencefortheproductionofthreemas | Physics Letters B, 798, 1 - 22. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.134913 | Evidence for the production of three massive vector bosons with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
felixbasedreadoutofthesingle-phase | EPJ Web of Conferences, 214, 1 - 8. ISSN 2100-014X. | Borga, A.; Church, E.; Filthaut, F.; Gamberini, E.; Jong, Pa. de; Habraken, R.; Miotto, G. Lehmann; Miedema, T.; Schreuder, F.; Schumacher, J.; Sipos, R.; Vermeulen, Milo; Wood, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1051/epjconf/201921401013 | FELIX based readout of the Single-Phase ProtoDUNE detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementoftheproductioncrosssect | Physics Letters B, 798, 1 - 24. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.134949 | Measurement of the production cross section for a Higgs boson in association with a vector boson in the H → WW⁎ → ℓνℓν channel in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforaright-handedgaugebosonde | Physics Letters B, 798, 1 - 23. ISSN 0370-2693. | Aaboud, M.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Igonkina, O.; Fabiani, V.; Filthaut, F.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.134942 | Search for a right-handed gauge boson decaying into a high-momentum heavy neutrino and a charged lepton in pp collisions with the ATLAS detector at s=13 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofangularandmomentumdist | Physical Review C, 100, 1 - 29. ISSN 2469-9985. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Abhayasinghe, D.K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, N.; Igonkina, O.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Proklova, N.; Rossi, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.100.064901 | Measurement of angular and momentum distributions of charged particles within and around jets in Pb plus Pb and pp collisions at √sNN = 5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 22 | (1.1) one exact match |
searchforpairproductionofhiggsboso | Journal of High Energy Physics, 1 - 49. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Banerjee, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2019)030 | Search for pair production of Higgs bosons in the b¯bb¯b final state using proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforheavychargedlong-livedpart | Physics Letters B, 788, 96 - 116. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.10.055 | Search for heavy charged long-lived particles in proton-proton collisions at √s = 13 TeV using an ionisation measurement with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforlightresonancesdecayingto | Physics Letters B, 788, 316 - 335. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Filthaut, F.; Fabiani, V.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.09.062 | Search for light resonances decaying to boosted quark pairs and produced in association with a photon or a jet in proton-proton collisions at √s = 13 teV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforvector-bosonresonancesdecay | Physics Letters B, 788, 347 - 370. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.11.032 | Search for vector-boson resonances decaying to a top quark and bottom quark in the lepton plus jets final state in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforlong-livedparticlesinfinal | Physical Review D, 99, 1 - 32. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.012001 | Search for long-lived particles in final states with displaced dimuon vertices in pp collisions at root s=13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementoftheflowharmoniccorrela | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 479 - 482. ISSN 0375-9474. | Derendarz, Dominik; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.09.076 | Measurement of the flow harmonic correlations in pp, p plus Pb and low multiplicity Pb plus Pb collisions with the ATLAS detector at the LHC | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
photon-taggedmeasurementsofjetquench | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 595 - 598. ISSN 0375-9474. | Perepelitsa, Dennis, V; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.09.056 | Photon-tagged measurements of jet quenching with ATLAS | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
charged-hadronsuppressioninpbpluspb | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 571 - 574. ISSN 0375-9474. | Balek, Petr; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Klein, M.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.10.079 | Charged-hadron suppression in Pb plus Pb and Xe plus Xe collisions measured with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
insitucalibrationoflarge-radiusjet | European Physical Journal C, 79, 1 - 42. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L.; Pedraza Diaz, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6632-8 | In situ calibration of large-radius jet energy and mass in 13 TeV proton-proton collisions with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementsofwandzbosonproduction | European Physical Journal C, 79, 1 - 29. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6622-x | Measurements of W and Z boson production in pp collisions at √s = 5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
erratumto:measurementofthewbosonp | The European Physical Journal C: Particles and Fields, 79, 1 - 14. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Kono, T.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6520-7 | Erratum to: Measurement of the W boson polarisation in tt¯ events from pp collisions at √s = 8 TeV in the lepton + jets channel with ATLAS | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthenuclearmodification | Physics Letters B, 790, 108 - 128. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Diaz, L. Pedraza; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.10.076 | Measurement of the nuclear modification factor for inclusive jets in Pb+Pb collisions at √sNN = 5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
studyoftheharddouble-partonscatteri | Physics Letters B, 790, 595 - 614. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.01.062 | Study of the hard double-parton scattering contribution to inclusive four-lepton production in pp collisions at √s = 8 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchesforthird-generationscalarlep | Journal of High Energy Physics, 1 - 48. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abhayasinghe, D.K.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Duan, Y.; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2019)144 | Searches for third-generation scalar leptoquarks in √s = 13 TeV pp collisions with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 22 | (1.1) one exact match |
searchforscalarresonancesdecayingin | Journal of High Energy Physics, 1 - 41. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Duan, Y.; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2019)117 | Search for scalar resonances decaying into µ+µ− in events with and without b-tagged jets produced in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
comparisonoffragmentationfunctionsfo | Physical Review Letters, 123, 1 - 21. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.123.042001 | Comparison of Fragmentation Functions for Jets Dominated by Light Quarks and Gluons from pp and Pb plus Pb Collisions in ATLAS | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
felix-basedreadoutofthesingle-phase | IEEE Transactions on Nuclear Science, 66, 993 - 997. ISSN 0018-9499. | Borga, Andrea; Church, Eric; Filthaut, Frank; Gamberini, Enrico; Jong, P. de; Lehmann Miotto, G.; Vermeulen, Milo; Wierman, Kevin; Wood, Lynn | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1109/tns.2019.2904660 | FELIX-Based Readout of the Single-Phase ProtoDUNE Detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
searchforcharginoandneutralinoprodu | Physical Review D, 100, 1 - 37. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.100.012006 | Search for chargino and neutralino production in final states with a Higgs boson and missing transverse momentum at at √s=13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchforlow-massresonancesdecaying | Physics Letters B, 795, 56 - 75. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.03.067 | Search for low-mass resonances decaying into two jets and produced in association with a photon using pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
propertiesofz±c(3900)producedinp¯p | Physical Review D, 100, 1 - 10. ISSN 2470-0010. | Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Agnew, J.P.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Zieminska, D.; Zivkovic, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.100.012005 | Properties of Z±c(3900) produced in p¯p collisions | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfordoublychargedscalarbosons | European Physical Journal C, 79, 1 - 30. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6500-y | Search for doubly charged scalar bosons decaying into same-sign W boson pairs with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforpairsofhighlycollimatedph | Physical Review D, 99, 1 - 29. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.012008 | Search for pairs of highly collimated photon-jets in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofphoton-jettransversemom | Physics Letters B, 789, 167 - 190. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.12.023 | Measurement of photon-jet transverse momentum correlations in 5.02 TeV Pb + Pb and pp collisions with ATLAS | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementsofgluon-gluonfusionandv | Physics Letters B, 789, 508 - 529. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.11.064 | Measurements of gluon-gluon fusion and vector-boson fusion Higgs boson production cross-sections in the H -> WW* -> eνμν decay channel in pp collisions at √s = 13TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforheavymajoranaordiracneutr | Journal of High Energy Physics, 1 - 16. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2019)016 | Search for heavy Majorana or Dirac neutrinos and right-handed W gauge bosons in final states with two charged leptons and two jets at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
correlatedlong-rangemixed-harmonicflu | Physics Letters B, 789, 444 - 471. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Nektarijevic, S.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.11.065 | Correlated long-range mixed-harmonic fluctuations measured in pp, p plus Pb and low-multiplicity Pb plus Pb collisions with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
astrategyforageneralsearchfornew | European Physical Journal C, 79, 1 - 45. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Klein, M.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6540-y | A strategy for a general search for new phenomena using data-derived signal regions and its application within the ATLAS experiment | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
electromagneticprocesseswithquasireal | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 259 - 262. ISSN 0375-9474. | Steinberg, Peter; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Klein, M; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.10.087 | Electromagnetic processes with quasireal photons in Pb plus Pb collisions: QED, QCD, and the QGP | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
electroweakprobesofsmallandlargesy | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 603 - 606. ISSN 0375-9474. | Citron, Zvi; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.09.029 | Electroweak probes of small and large systems with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
flowfluctuationsinpbpluspbcollisio | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 323 - 326. ISSN 0375-9474. | Zhou, Mingliang; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.09.012 | Flow fluctuations in Pb plus Pb collisions at root s(NN)=5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
highlightsfromtheatlasexperiment | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 8 - 14. ISSN 0375-9474. | Grabowska-Bold, Iwona; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.08.024 | Highlights from the ATLAS experiment | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
jetsuppressionandjetsubstructurein | Nuclear Physics A: Nuclear and Hadronic Physics, 982, 611 - 614. ISSN 0375-9474. | Spousta, Martin; Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.08.031 | Jet suppression and jet substructure in Pb plus Pb and Xe plus Xe collisions with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
combinationofsearchesforinvisiblehi | Physical Review Letters, 122, 1 - 208. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zhang, Y.; Zhang, Z. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.122.231801 | Combination of Searches for Invisible Higgs Boson Decays with the ATLAS Experiment | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
measurementofw+/-zproductioncross | European Physical Journal C, 79, 1 - 34. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7027-6 | Measurement of W +/- Z production cross sections and gauge boson polarisation in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
erratumto:measurementsofwandzboso | The European Physical Journal C: Particles and Fields, 79, 1 - 15. ISSN 1434-6052. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6870-9 | Erratum to: Measurements of W and Z boson production in pp collisions at √s = 5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
performanceoftop-quarkandw-bosontag | The European Physical Journal C: Particles and Fields, 79, 1 - 54. ISSN 1434-6052. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6847-8 | Performance of top-quark and W-boson tagging with ATLAS in Run 2 of the LHC | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofvh,h→bb¯¯¯productionas | Journal of High Energy Physics, 1 - 36. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abud, A.Abed; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Klein, M; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2019)141 | Measurement of VH, H→bb¯¯¯ production as a function of the vector-boson transverse momentum in 13 TeV pp collisions with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 22 | (1.1) one exact match |
observationofelectroweakw±zbosonpai | Physics Letters B, 793, 469 - 492. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.05.012 | Observation of electroweak W±Z boson pair production in association with two jets in ppcollisions at √s = 13TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforinvisiblehiggsbosondecays | Physics Letters B, 793, 499 - 519. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.04.024 | Search for invisible Higgs boson decays in vector boson fusion at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforsingleproductionofvector-l | Journal of High Energy Physics, 1 - 56. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2019)164 | Search for single production of vector-like quarks decaying into Wb in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
combinationsofsingle-top-quarkproduct | Journal of High Energy Physics, 2019, 1 - 81. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abud, A.Abed; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2019)088 | Combinations of single-top-quark production cross-section measurements and |fLVVtb| determinations at √s = 7 and 8 TeV with the ATLAS and CMS experiments | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
constraintsonmediator-baseddarkmatte | Journal of High Energy Physics, 1 - 87. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abud, A.Abed; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Zou, R.; Zwalinski, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2019)142 | Constraints on mediator-based dark matter and scalar dark energy models using √s = 13 TeV pp collision data collected by the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
dijetazimuthalcorrelationsandconditi | Physical Review C, 100, 1 - 24. ISSN 2469-9985. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.100.034903 | Dijet azimuthal correlations and conditional yields in pp and p plus Pb collisions at √sNN = 5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
propertiesofjetfragmentationusingch | Physical Review D, 100, 1 - 38. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.100.052011 | Properties of jet fragmentation using charged particles measured with the ATLAS detector in pp collisions at √s = 13 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofthecross-sectionandcha | European Physical Journal C, 79, 1 - 25. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Abeling, K.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7199-0 | Measurement of the cross-section and charge asymmetry of W bosons produced in proton-proton collisions at √s = 8 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
modellingradiationdamagetopixelsens | Journal of Instrumentation, 14, 1 - 52. ISSN 1748-0221. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abhayasinghe, D.K.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Pedraza Diaz, L.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/14/06/p06012 | Modelling radiation damage to pixel sensors in the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
electronreconstructionandidentificati | European Physical Journal C, 79, 1 - 40. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Ilic, N.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7140-6 | Electron reconstruction and identification in the ATLAS experiment using the 2015 and 2016 LHC proton-proton collision data at √s = 13 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
observationoflight-by-lightscattering | Physical Review Letters, 123, 1 - 21. ISSN 0031-9007. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Duan, Y.; Fabiani, V.; Filthaut, F.; König, A.C; Igonkina, O.B.; Ilic, N.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.123.052001 | Observation of Light-by-Light Scattering in Ultraperipheral Pb plus Pb Collisions with the ATLAS Detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
measurementofdistributionssensitivet | European Physical Journal C, 79, 1 - 31. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Abeling, K.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7162-0 | Measurement of distributions sensitive to the underlying event in inclusive Z boson production in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
measurementofjet-substructureobservab | Journal of High Energy Physics, 1 - 47. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2019)033 | Measurement of jet-substructure observables in top quark, W boson and light jet production in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
measurementofw-+/–bosonandz-bosonp | European Physical Journal C, 79, 1 - 29. ISSN 1434-6044. | Aaboud, M.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7399-7 | Measurement of W-+/–boson and Z-boson production cross-sections in pp collisions at √s = 2.76 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
electronandphotonperformancemeasurem | Journal of Instrumentation, 14, 1 - 70. ISSN 1748-0221. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/14/12/p12006 | Electron and photon performance measurements with the ATLAS detector using the 2015–2017 LHC proton-proton collision data | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
erratum:searchforresonantandnonreso | Physical Review Letters, 122, 1 - 1. ISSN 0031-9007. | Aaboud, M.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.122.089901 | Erratum: Search for Resonant and Nonresonant Higgs Boson Pair Production in the b¯bτ+τ− Decay Channel in pp Collisions at √s = 13 TeV with the ATLAS Detector [Phys. Rev. Lett. 121, 191801 (2018)] | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofw±bosonproductioninpb | The European Physical Journal C: Particles and Fields, 79, 1 - 32. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7439-3 | Measurement of W± boson production in Pb+Pb collisions at √sNN = 5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofzzproductionintheℓℓνν | Journal of High Energy Physics, 2019, 1 - 48. ISSN 1029-8479. | Aaboud, M.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Diaz, L. Pedraza; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2019)127 | Measurement of ZZ production in the ℓℓνν final state with the ATLAS detector in pp collisions at √s = 13 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementofflowharmonicscorrelatio | The European Physical Journal C: Particles and Fields, 79, 1 - 29. ISSN 1434-6052. | Aaboud, M.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gotttardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7489-6 | Measurement of flow harmonics correlations with mean transverse momentum in lead–lead and proton–lead collisions at √sNN = 5.02 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthetop-quarkmassintt¯ | Journal of High Energy Physics, 2019, 1 - 40. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2019)150 | Measurement of the top-quark mass in tt¯ + 1-jet events collected with the ATLAS detector in pp collisions at √s = 8 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsoftop-quarkpairdifferent | European Physical Journal C, 79, 1 - 84. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Abhayasinghe, D.K.; Aggarwal, A.; Caron, S.; Castelijn, R.J.A.M.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, N.; Igonkina, O.; Ilic, N.; König, A.C; Kremer, J.A; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7525-6 | Measurements of top-quark pair differential and double-differential cross-sections in the l plus jets channel with pp collisions at root s=13 TeV using the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 22 | (1.1) one exact match |
searchforbottom-squarkpairproduction | Journal of High Energy Physics, 2019, 1 - 50. ISSN 1029-8479. | Aaboud, M.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2019)060 | Search for bottom-squark pair production with the ATLAS detector in final states containing Higgs bosons, b-jets and missing transverse momentum | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforheavyneutralleptonsindeca | Journal of High Energy Physics, 2019, 1 - 47. ISSN 1029-8479. | Aaboud, M.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2019)265 | Search for heavy neutral leptons in decays of W bosons produced in 13 TeV pp collisions using prompt and displaced signatures with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
atlasb-jetidentificationperformancea | The European Physical Journal C: Particles and Fields, 79, 1 - 36. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7450-8 | ATLAS b-jet identification performance and efficiency measurement with tt¯ events in pp collisions at √s = 13 TeV | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthett¯zandtt¯wcross | Physical Review D, 99, 1 - 38. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.072009 | Measurement of the tt¯Z and tt¯W cross sections in proton-proton collisions at √s=13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforheavyparticlesdecayinginto | Physical Review D, 99, 1 - 38. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.99.092004 | Search for heavy particles decaying into a top-quark pair in the fully hadronic final state in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforlargemissingtransversemome | Journal of High Energy Physics, 1 - 50. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2019)041 | Search for large missing transverse momentum in association with one top-quark in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchfortop-quarkdecayst->hqwith | Journal of High Energy Physics, 1 - 67. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2019)123 | Search for top-quark decays t -> Hq with 36 fb(-1) of pp collision data at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
resolutionoftheatlasmuonspectromete | Journal of Instrumentation, 14, 1 - 35. ISSN 1748-0221. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/14/09/p09011 | Resolution of the ATLAS muon spectrometer monitored drift tubes in LHC Run 2 | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforaheavychargedbosonineven | Physical Review D, 100, 1 - 29. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.100.052013 | Search for a heavy charged boson in events with a charged lepton and missing transverse momentum from pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
measurementoftheinclusiveisolated-ph | Journal of High Energy Physics, 1 - 51. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2019)203 | Measurement of the inclusive isolated-photon cross section in pp collisions at √s = 13 TeV using 36 fb(-1) of ATLAS data | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
electronandphotonenergycalibrationw | Journal of Instrumentation, 14, 1 - 60. ISSN 1748-0221. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; Igonkina, O.; Klein, M; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/14/03/p03017 | Electron and photon energy calibration with the ATLAS detector using 2015-2016 LHC proton-proton collision data | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
measurementofthetopquarkmassinthe | European Physical Journal C, 79, 1 - 51. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Klein, M.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Pedraza Diaz, L.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-6757-9 | Measurement of the top quark mass in the t ¯t →lepton+jets channel from √s = 8 TeV ATLAS data and combination with previous results | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforelectroweakdibosonproductio | Physical Review D, 100, 1 - 36. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Abeling, K.; Aggarwal, A.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.100.032007 | Search for electroweak diboson production in association with a high-mass dijet system in semileptonic final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
measurementofpromptphotonproduction | Physics Letters B, 796, 230 - 252. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.07.031 | Measurement of prompt photon production in √sNN = 8.16 TeV p Pb collisions with ATLAS | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforhigh-massdileptonresonances | Physics Letters B, 796, 68 - 87. ISSN 0370-2693. | Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abde Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2019.07.016 | Search for high-mass dilepton resonances using 139 fb(-1) of pp collision data collected at √s = 13 TeV with the ATLAS detector | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchesforscalarleptoquarksanddiff | European Physical Journal C, 79, 1 - 45. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-019-7181-x | Searches for scalar leptoquarks and differential cross-section measurements in dilepton-dijet events in proton-proton collisions at a centre-of-mass energy of √s=13 TeV with the ATLAS experiment | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforsupersymmetryinfinalstates | Journal of High Energy Physics, 1 - 19. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2019 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2019)121 | Search for supersymmetry in final states with two same-sign or three leptons and jets using 36 fb(-1) of √s = 13 TeV pp collision data with the ATLAS detector (vol 09, 084, 2017) | 2019 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforthedirectproductionofchar | European Physical Journal C, 78, 1 - 33. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Nektarijevic, S.; Nedden, M. Zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5583-9 | Search for the direct production of charginos and neutralinos in final states with tau leptons in √s = 13TeV pp collisions with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
measurementofdifferentialcross-sectio | European Physical Journal C, 78, 1 - 29. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Nedden, M. Zur; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5649-8 | Measurement of differential cross-sections of a single top quark produced in association with a W boson at √s = 13 TeV with ATLAS | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchesforheavyzzandzwresonances | Journal of High Energy Physics, 2018, 1 - 53. ISSN 1126-6708. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Nedden, M. Zur; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2018)009 | Searches for heavy ZZ and ZW resonances in the ℓℓqq and ννqq final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementoftheproductioncross-sect | Physics Letters B, 780, 557 - 577. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.03.023 | Measurement of the production cross-section of a single top quark in association with a Z boson in proton–proton collisions at 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforw′→tbdecaysinthehadroni | Physics Letters B, 781, 327 - 348. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.03.036 | Search for W′ → tb decays in the hadronic final state using pp collisions at √s = 13TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthecrosssectionforiso | Physics Letters B, 780, 578 - 602. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.03.035 | Measurement of the cross section for isolated-photon plus jet production in pp collisions at √s = 13 TeV using the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
evidencefortheassociatedproductiono | Physical Review D, 97, 1 - 44. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schioppa, E.J.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.072003 | Evidence for the associated production of the Higgs boson and a top quark pair with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforhigh-massresonancesdecaying | Physical Review Letters, 120, 1 - 20. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.120.161802 | Search for High-Mass Resonances Decaying to τν in pp Collisions at √s = 13 TeV with the ATLAS Detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforheavyzzresonancesintheℓ+ | European Physical Journal C, 78, 1 - 34. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5686-3 | Search for heavy ZZ resonances in the ℓ+ℓ−ℓ+ℓ− and ℓ+ℓ−νν¯ final states using proton–proton collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofthehiggsbosonmassint | Physics Letters B, 784, 345 - 366. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.07.050 | Measurement of the Higgs boson mass in the H -> ZZ* -> 4l and H -> gamma gamma channels with root s=13 TeV pp collisions using the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
observationofhiggsbosonproductionin | Physics Letters B, 784, 173 - 191. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.07.035 | Observation of Higgs boson production in association with a top quark pair at the LHC with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
promptandnon-promptj/ψellipticflow | European Physical Journal C, 78, 1 - 23. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Ilic, N.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Ponomarenko, D.; Schouwenberg, J.F.P.; Zhao, P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6243-9 | Prompt and non-prompt J/ψ elliptic flow in Pb+Pb collisions at √sNN =5.02 Tev with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
evidenceforz(c)(+/-)(3900)insemi-inc | Physical Review D, 98, 1 - 11. ISSN 2470-0010. | Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Agnew, J.P.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Zieminska, D.; Zivkovic, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.052010 | Evidence for Z(c)(+/-)(3900) in semi-inclusive decays of b-flavored hadrons | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
comparisonbetweensimulatedandobserve | Journal of Instrumentation, 13, 1 - 40. ISSN 1748-0221. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/13/12/p12006 | Comparison between simulated and observed LHC beam backgrounds in the ATLAS experiment at E-beam=4 TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
measurementofτpolarisationinz/γ∗→ | European Physical Journal C, 78, 1 - 30. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Bakker, R.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Nedden, M. Zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5619-1 | Measurement of τ polarisation in Z/γ∗ → ττ decays in proton–proton collisions at √s = 8 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofquarkoniumproductionin | European Physical Journal C, 78, 1 - 32. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdallah, J.; Abdinov, O.; Abeloos, B.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Nedden, M. Zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5624-4 | Measurement of quarkonium production in proton-lead and proton-proton collisions at 5.02 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforww/wzresonanceproduction | Journal of High Energy Physics, 1 - 45. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, .; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2018)042 | Search for W W/W Z resonance production in ℓνqq final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchfordoublychargedhiggsbosonpr | European Physical Journal C, 78, 1 - 34. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5661-z | Search for doubly charged Higgs boson production in multi-lepton final states with the ATLAS detector using proton-proton collisions at √s = 13TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforelectroweakproductionofsup | Physical Review D, 97, 1 - 35. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Schioppa, E.J.; Schouwenberg, J.F.P.; Zwalinski, L.; Igonkina, O. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.052010 | Search for electroweak production of supersymmetric states in scenarios with compressed mass spectra at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
asearchforpair-producedresonancesin | European Physical Journal C, 78, 1 - 28. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5693-4 | A search for pair-produced resonances in four-jet final states at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
measurementsoft¯tdifferentialcross-s | Physical Review D, 98, 1 - 39. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.012003 | Measurements of t¯t differential cross-sections of highly boosted top quarks decaying to all-hadronic final states in pp collisions at √s = 13 TeV using the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforexclusivehiggsandzbosond | Journal of High Energy Physics, 1 - 32. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Zou, R.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2018)127 | Search for exclusive Higgs and Z boson decays to ϕγ and ργ with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchfornewphenomenausingtheinvar | European Physical Journal C, 78, 1 - 38. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6081-9 | Search for new phenomena using the invariant mass distribution of same-flavour opposite-sign dilepton pairs in events with missing transverse momentum in √s = 13 TeV pp collisions with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
measurementofjetfragmentationin5.02 | Nuclear Physics A: Nuclear and Hadronic Physics, 978, 65 - 106. ISSN 0375-9474. | Aaboud, M.; Aad, G.; Abbott, B.; Abdallah, J.; Abdinov, O.; Abeloos, B.; Caron, S.; Colasurdo, L.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2018.07.006 | Measurement of jet fragmentation in 5.02 TeV proton-lead and proton-proton collisions with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
measurementsofhiggsbosonpropertiesi | Physical Review D, 98, 1 - 87. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.052005 | Measurements of Higgs boson properties in the diphoton decay channel with 36 fb(-1) of pp collision data at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
measurementofcolourflowusingjet-pul | European Physical Journal C, 78, 1 - 31. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6290-2 | Measurement of colour flow using jet-pull observables in in t(t)over-bar events with the ATLAS experiment at √s = 13 TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
measurementofthesuppressionandazimu | Physical Review C, 98, 1 - 34. ISSN 2469-9985. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.98.044905 | Measurement of the suppression and azimuthal anisotropy of muons from heavy-flavor decays in Pb plus Pb collisions at root s(NN)=2.76 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
probingthequantuminterferencebetween | Physical Review Letters, 121, 1 - 20. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.121.152002 | Probing the Quantum Interference between Singly and Doubly Resonant Top-Quark Production in pp Collisions at √s = 13 TeV with the ATLAS Detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
constraintsonoff-shellhiggsbosonpro | Physics Letters B, 786, 223 - 244. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.09.048 | Constraints on off-shell Higgs boson production and the Higgs boson total width in ZZ → 4ℓ and ZZ → 2ℓ2ν final states with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
erratumto:measurementofthew-bosonm | The European Physical Journal C: Particles and Fields, 78, 1 - 14. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6354-3 | Erratum to: Measurement of the W-boson mass in pp collisions at √s = 7 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsofdifferentialcrosssecti | Journal of High Energy Physics, 2018, 1 - 58. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2018)159 | Measurements of differential cross sections of top quark pair production in association with jets in pp collisions at √s = 13 TeV using the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
observationofh→bb¯decaysandvhprodu | Physics Letters B, 786, 59 - 86. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Diaz, L. Pedraza; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.09.013 | Observation of H→bb¯ decays and VH production with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforr-parity-violatingsupersymme | Physics Letters B, 785, 136 - 158. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.08.021 | Search for R-parity-violating supersymmetric particles in multi-jet final states produced in p–p collisions at √s = 13 TeV using the ATLAS detector at the LHC | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforresonantwzproductioninthe | Physics Letters B, 787, 68 - 88. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Diaz, L. Pedraza; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.10.021 | Search for resonant WZ production in the fully leptonic final state in proton–proton collisions at √s = 13TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforthehiggsbosonproducedina | Journal of High Energy Physics, 2018, 1 - 48. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2018)031 | Search for the Higgs boson produced in association with a vector boson and decaying into two spin-zero particles in the H -> aa -> 4b channel in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchesforexclusivehiggsandzboson | Physics Letters B, 786, 134 - 155. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Diaz, L. Pedraza; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.09.024 | Searches for exclusive Higgs and Z boson decays into J/ψ γ, ψ(2S) γ, and ϒ(nS) γ at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
angularanalysisofbd0→k∗μ+μ−deca | Journal of High Energy Physics, 2018, 1 - 47. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2018)047 | Angular analysis of B d 0 → K∗μ+μ− decays in pp collisions at √s = 8 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
combinedmeasurementofdifferentialand | Physics Letters B, 786, 114 - 133. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.09.019 | Combined measurement of differential and total cross sections in the H → γγ and the H → ZZ⁎ → 4ℓ decay channels at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfordarkmatterineventswitha | Journal of High Energy Physics, 2018, 1 - 58. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, Nicolo de; Fabiani, V.; Filthaut, F.; Galea, C.F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2018)180 | Search for dark matter in events with a hadronically decaying vector boson and missing transverse momentum in pp collisions at √s = 13TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforsupersymmetryineventswith | Physical Review D, 98, 1 - 31. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.032009 | Search for supersymmetry in events with four or more leptons in √s = 13 TeV pp collisions with ATLAS | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
cptestsofhiggscouplingsint(t)over- | Physical Review D, 98, 1 - 11. ISSN 2470-0010. | Azevedo, D.; Onofre, A.; Filthaut, F.; Goncalo, R. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.033004 | CP tests of Higgs couplings in t(t)over-barh semileptonic events at the LHC | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 4 | (1.1) one exact match |
measurementofthesoft-dropjetmassin | Physical Review Letters, 121, 1 - 21. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.121.092001 | Measurement of the Soft-Drop Jet Mass in pp Collisions at √s = 13 TeV with the ATLAS Detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforlow-massdijetresonancesusi | Physical Review Letters, 121, 1 - 20. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.121.081801 | Search for Low-Mass Dijet Resonances Using Trigger-Level Jets with the ATLAS Detector in pp Collisions at root s=13 TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforheavyresonancesdecayingto | Physical Review D, 98, 1 - 29. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.032015 | Search for heavy resonances decaying to a photon and a hadronically decaying Z/W/H boson in pp collisions at √s =13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforresonancesinthemassdistri | Physical Review D, 98, 1 - 24. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.032016 | Search for resonances in the mass distribution of jet pairs with one or two jets identified as b-jets in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchforchargedhiggsbosonsdecaying | Journal of High Energy Physics, 2018, 1 - 48. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2018)139 | Search for charged Higgs bosons decaying via H± → τ±ντ in the τ+jets and τ+lepton final states with 36 fb−1 of pp collision data recorded at √s = 13 TeV with the ATLAS experiment | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforresonantandnonresonanthigg | Physical Review Letters, 121, 1 - 24. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.121.191801 | Search for Resonant and Nonresonant Higgs Boson Pair Production in the b¯bτ+τ− Decay Channel in pp Collisions at √s = 13 TeV with the ATLAS Detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforlepton-flavorviolationindi | Physical Review D, 98, 1 - 34. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.092008 | Search for lepton-flavor violation in different-flavor, high-mass final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforlepton-flavor-violatingdecay | Physical Review D, 98, 1 - 31. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.092010 | Search for lepton-flavor-violating decays of the Z boson into a r lepton and a light lepton with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforpairproductionofhiggsinos | Physical Review D, 98, 1 - 34. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.092002 | Search for pair production of Higgsinos in final states with at least three b-tagged jets in √s = 13 TeV pp collisions using the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforpairproductionofheavyvect | Physical Review D, 98, 1 - 36. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.092005 | Search for pair production of heavy vectorlike quarks decaying into hadronic final states in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementofdijetazimuthaldecorrela | Physical Review D, 98, 1 - 31. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.092004 | Measurement of dijet azimuthal decorrelations in pp collisions at √s = 8 TeV with the ATLAS detector and determination of the strong coupling | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofthew-bosonmassinppco | European Physical Journal C, 78, 1 - 14. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdallah, J.; Abdinov, O.; Abeloos, B.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | NA | Measurement of the W-boson mass in pp collisions at √s = 7 TeV with the ATLAS detector (vol 78, 110, 2018) | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
erratumto:searchforheavyresonances | Journal of High Energy Physics, 2018, 1 - 53. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2018)051 | Erratum to: Search for heavy resonances decaying into a W or Z boson and a Higgs boson in final states with leptons and b-jets in 36 fb(-1) of √s = 13 TeV pp collisions with the ATLAS detector (vol 3, 174, 2018) | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
combinationofsearchesforheavyresona | Physical Review D, 98, 1 - 32. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.052008 | Combination of searches for heavy resonances decaying into bosonic and leptonic final states using 36 fb(-1) of proton-proton collision data at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
combinationofthesearchesforpair-pro | Physical Review Letters, 121, 1 - 20. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.121.211801 | Combination of the Searches for Pair-Produced Vectorlike Partners of the Third-Generation Quarks at root s=13 TeV with the ATLAS Detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforflavor-changingneutralcurre | Physical Review D, 98, 1 - 25. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.032002 | Search for flavor-changing neutral currents in top quark decays t -> Hc and t -> Hu in multilepton final states in proton-proton collisions at root s=13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofjetfragmentationinpbp | Physical Review C, 98, 1 - 34. ISSN 2469-9985. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.98.024908 | Measurement of jet fragmentation in Pb plus Pb and pp collisions at √sNN = 5.02 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementsofb-jettaggingefficiency | Journal of High Energy Physics, 2018, 1 - 47. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Pedraza Diaz, L.; Zhao, X.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2018)089 | Measurements of b-jet tagging efficiency with the ATLAS detector using t(t)over-bar events at √s = 13TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforaheavyhiggsbosondecaying | Physics Letters B, 783, 392 - 414. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.07.006 | Search for a heavy Higgs boson decaying into a Z boson and another heavy Higgs boson in the ℓℓbb final state in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchfortopsquarksdecayingtotaus | Physical Review D, 98, 1 - 33. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zhao, X.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.032008 | Search for top squarks decaying to tau sleptons in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
combinationofinclusiveanddifferentia | Journal of High Energy Physics, 2018, 1 - 68. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2018)033 | Combination of inclusive and differential t(t)over-bar charge asymmetry measurements using ATLAS and CMS data at √s = 7 and 8 TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
operationandperformanceoftheatlast | The European Physical Journal C: Particles and Fields, 78, 1 - 48. ISSN 1434-6052. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6374-z | Operation and performance of the ATLAS Tile Calorimeter in Run 1 | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
performanceofmissingtransversemoment | The European Physical Journal C: Particles and Fields, 78, 1 - 46. ISSN 1434-6052. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6288-9 | Performance of missing transverse momentum reconstruction with the ATLAS detector using proton–proton collisions at √s = 13 TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfornewphenomenaineventswith | Journal of High Energy Physics, 2018, 1 - 56. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2018)039 | Search for new phenomena in events with same-charge leptons and b-jets in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforpairandsingleproductionof | Physical Review D, 98, 1 - 53. ISSN 2470-0010. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.112010 | Search for pair and single production of vectorlike quarks in final states with at least one Z boson decaying into a pair of electrons or muons in pp collision data collected with he ATLAS detector at √s = 13 TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
promptandnon-promptj/psiandpsi(2s) | European Physical Journal C, 78, 1 - 28. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zou, R. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-6219-9 | Prompt and non-prompt J/psi and psi(2S) suppression at high transverse momentum in 5.02 TeV Pb+Pb collisions with the ATLAS experiment | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforhiggsbosonsproducedviavec | Physical Review D, 98, 1 - 29. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.98.052003 | Search for Higgs bosons produced via vector-boson fusion and decaying into bottom quark pairs in √s = 13 TeV pp collisions with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
observationofcentrality-dependentacop | Physical Review Letters, 121, 1 - 21. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abhayasinghe, D.K.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.121.212301 | Observation of Centrality-Dependent Acoplanarity for Muon Pairs Produced via Two-Photon Scattering in Pb plus Pb Collisions at √sNN = 5.02 TeV with the ATLAS Detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementofthezγ→ν¯νγproduction | Journal of High Energy Physics, 2018, 1 - 42. ISSN 1029-8479. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2018)010 | Measurement of the Zγ → ν¯νγ production cross section in pp collisions at √s = 13 TeV with the with the ATLAS detector and limits on anomalous triple gauge-boson couplings | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforb-lr-parity-violatingtop | Physical Review D, 97, 1 - 28. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zhu, J.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.032003 | Search for B - L R-parity-violating top squarks in √s = 13 TeV pp collisions with the ATLAS experiment | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchfordibosonresonanceswithboson | Physics Letters B, 777, 91 - 113. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zhu, J.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.12.011 | Search for diboson resonances with boson-tagged jets in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchfornewphenomenainhigh-massfi | European Physical Journal C, 78, 1 - 25. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5553-2 | Search for new phenomena in high-mass final states with a photon and a jet from pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
measurementoftheexclusiveγγ→μ+μ−pro | Physics Letters B, 777, 303 - 323. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zhu, J.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.12.043 | Measurement of the exclusive γγ→μ+μ− process in proton–proton collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementoflong-rangemultiparticle | Physical Review C, 97, 1 - 25. ISSN 2469-9985. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Chow, Y.S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Nedden, M. Zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.97.024904 | Measurement of long-range multiparticle azimuthal correlations with the subevent cumulant method in pp and p+Pb collisions with the ATLAS detector at the CERN Large Hadron Collider | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
zz→ℓ+ℓ−ℓ’+ℓ’−cross-sectionmeasurement | Physical Review D, 97, 1 - 39. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Chow, Y.S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Nedden, M. Zur; Zwalinski, L.; Igonkina, O. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.032005 | ZZ→ℓ+ℓ−ℓ’+ℓ’− cross-section measurements and search for anomalous triple gauge couplings in 13 TeV pp collisions with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
directtop-quarkdecaywidthmeasurement | European Physical Journal C, 78, 1 - 30. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Chelstowska, M.A.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Nedden, M. Zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5595-5 | Direct top-quark decay width measurement in the tt¯ lepton+jets channel at √s = 8 TeV with the ATLAS experiment | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
measurementoflongitudinalflowdecorre | European Physical Journal C, 78, 1 - 37. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Chelstowska, M.A.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Nedden, M. Zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5605-7 | Measurement of longitudinal flow decorrelations in Pb+Pb collisions at √sNN = 2.76 and 5.02 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
searchfordarkmatterproducedinassoc | European Physical Journal C, 78, 1 - 36. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Bauer, F.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Young, C.B.; Nedden, M. Zur; Zwalinski, L.; Alderweireldt, S.; Besjes, G.J.; Castelijn, R.J.A.M.; Chan, W.S.; Croft, V.A.; Dao, V.; Igonkina, O.; König, A.C; Strübig, A.H. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5486-1 | Search for dark matter produced in association with bottom or top quarks in √s = 13 TeV pp collisions with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 29 | (1.1) one exact match |
asearchforresonancesdecayingintoa | Physics Letters B, 779, 24 - 45. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.01.042 | A search for resonances decaying into a Higgs boson and a new particle X in the XH→qqbb final state with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthecross-sectionforpro | Journal of High Energy Physics, 2018, 1 - 42. ISSN 1126-6708. | Aaboud, M.; Aad, G.; Abbott, B.; Abdallah, J.; Abdinov, O.; Abeloos, B.; Aben, R.W.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Gao, J.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Nguyen, D.; Schouwenberg, J.F.P.; Strubig, A.; Nedden, M. Zur; Zwalinski, L.; Aben, R.W | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2018)063 | Measurement of the cross-section for producing a W boson in association with a single top quark in pp collisions at √s = 13 TeV with ATLAS | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 23 | (1.1) one exact match |
searchforadditionalheavyneutralhigg | Journal of High Energy Physics, 2018, 1 - 54. ISSN 1126-6708. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2018)055 | Search for additional heavy neutral Higgs and gauge bosons in the ditau final state produced in 36 fb(-1) of pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
combinedforward-backwardasymmetrymeas | Physical Review Letters, 120, 1 - 12. ISSN 0031-9007. | Aaltonen, T.; Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Cho, K.; Jong, S.J. de; Filthaut, F.; Malik, S.; Meijer, M.M.; Svoisky, P.; Titov, Mikhail; Zivkovic, L.; Zucchelli, S. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.120.042001 | Combined Forward-Backward Asymmetry Measurements in Top-Antitop Quark Production at the Tevatron | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
searchforaninvisiblydecayinghiggsb | Physics Letters B, 776, 318 - 337. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Nedden, M. Zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.11.049 | Search for an invisibly decaying Higgs boson or dark matter candidates produced in association with a Z boson in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchfordarkmatterandothernewphe | Journal of High Energy Physics, 2018, 1 - 53. ISSN 1126-6708. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zhu, J.; Nedden, M.zur; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2018)126 | Search for dark matter and other new phenomena in events with an energetic jet and large missing transverse momentum using the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
measurementofinclusivejetanddijetc | Journal of High Energy Physics, 1 - 47. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2018)195 | Measurement of inclusive jet and dijet cross-sections in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
measurementoftheeffectiveweakmixing | Physical Review Letters, 120, 1 - 8. ISSN 0031-9007. | Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Agnew, J.P.; Jong, S.J. de; Filthaut, F.; Malik, S.; Meijer, M.M.; Titov, Mikhail; Zieminska, D.; Zivkovic, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.120.241802 | Measurement of the Effective Weak Mixing Angle in p¯p→Z/γ∗→ℓ+ℓ− Events | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementoftheinclusiveandfiducia | European Physical Journal C, 78, 1 - 31. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5904-z | Measurement of the inclusive and fiducial t ¯t production cross-sections in the lepton plus jets channel in pp collisions at √s = 8 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforanewheavygauge-bosonreson | European Physical Journal C, 78, 1 - 23. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-018-5877-y | Search for a new heavy gauge-boson resonance decaying into a lepton and missing transverse momentum in 36 fb(-1) of pp collisions √s = 13 TeV with the ATLAS experiment | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforlong-livedcharginosbasedon | Journal of High Energy Physics, 1 - 48. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2018)022 | Search for long-lived charginos based on a disappearing-track signature in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
tevatronruniicombinationoftheeffec | Physical Review D, 97, 1 - 19. ISSN 2470-0010. | Aaltonen, T.; Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Zivkovic, L.; Zucchelli, S. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.112007 | Tevatron Run II combination of the effective leptonic electroweak mixing angle | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforhiggsbosondecaystobeyond- | Journal of High Energy Physics, 1 - 51. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2018)166 | Search for Higgs boson decays to beyond-the-Standard-Model light bosons in four-lepton events with the ATLAS detector at √s = 13 TeV | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchfortop-squarkpairproductionin | Journal of High Energy Physics, 1 - 96. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2018)108 | Search for top-squark pair production in final states with one lepton, jets, and missing transverse momentum using 36 fb(-1) of √s = 13 TeV pp collision data with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
searchforhiggsbosondecaysintopairs | Physics Letters B, 782, 750 - 767. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2018.06.011 | Search for Higgs boson decays into pairs of light (pseudo)scalar particles in the γγjj final state in pp collisions at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforpairproductionofup-typeve | Journal of High Energy Physics, 1 - 68. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2018)089 | Search for pair production of up-type vector-like quarks and for four-top-quark events in final states with multiple b-jets with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
measurementofthehiggsbosoncoupling | Journal of High Energy Physics, 2018, 1 - 60. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2018)095 | Measurement of the Higgs boson coupling properties in the H → ZZ∗ → 4ℓ decay channel at √s = 13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforastructureintheb-s(0)π(+/ | Physical Review Letters, 120, 1 - 19. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Igonkina, O.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.120.202007 | Search for a Structure in the B-s(0)π(+/-) Invariant Mass Spectrum with the ATLAS Experiment | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforphotonicsignaturesofgauge- | Physical Review D, 97, 1 - 32. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.092006 | Search for photonic signatures of gauge-mediated supersymmetry in 13 TeV pp collisions with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
searchforthedecayofthehiggsboson | Physical Review Letters, 120, 1 - 20. ISSN 0031-9007. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.120.211802 | Search for the Decay of the Higgs Boson to Charm Quarks with the ATLAS Experiment | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforthestandardmodelhiggsboso | Physical Review D, 97, 1 - 44. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Zwalinski, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.072016 | Search for the standard model Higgs boson produced in association with top quarks and decaying into a b(b)overbar pair in pp collisions at root s=13 TeV with the ATLAS detector | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
studyofthex-+/-(5568)statewithsemi | Physical Review D, 97, 1 - 19. ISSN 2470-0010. | Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Agnew, J.P.; Jong, S.J. de; Meijer, M.M.; Filthaut, F.; Titov, Mikhail; Zieminska, D.; Zivkovic, L. | 2018 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.97.092004 | Study of the X-+/-(5568) state with semileptonic decays of the B-s(0) meson | 2018 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
evidenceforlight-by-lightscatteringi | Nature Physics, 13, 852 - 868. ISSN 1745-2473. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1038/nphys4208 | Evidence for light-by-light scattering in heavy-ion collisions with the ATLAS detector at the LHC | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
identificationandrejectionofpile-up | European Physical Journal C, 77, 1 - 32. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5081-5 | Identification and rejection of pile-up jets at high pseudorapidity with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
jetenergyscalemeasurementsandtheir | Physical Review D, 96, 1 - 36. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Ilchenko, Y.; König, A.C; Nektarijevic, S.; Onyisi, P.U.E.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.96.072002 | Jet energy scale measurements and their systematic uncertainties in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementoftheinclusivejetcross-s | Journal of High Energy Physics, 2017, 1 - 54. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2017)020 | Measurement of the inclusive jet cross-sections in proton-proton collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfornewphenomenainaleptonplu | Journal of High Energy Physics, 2017, 1 - 50. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2017)088 | Search for new phenomena in a lepton plus high jet multiplicity final state the ATLAS experiment using √s = 13 TeV proton-proton collision data | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchfornewphenomenaindijetevents | Physical Review D, 96, 1 - 26. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.96.052004 | Search for new phenomena in dijet events using 37 fb−1 of pp collision data collected at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforpairproductionofvector-lik | Journal of High Energy Physics, 2017, 1 - 40. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2017)052 | Search for pair production of vector-like top quarks in events with one lepton, jets, and missing transverse momentum in √s = 13 TeV pp collisions with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchesforthezγdecaymodeofthehi | Journal of High Energy Physics, 2017, 1 - 51. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2017)112 | Searches for the Zγ decay mode of the Higgs boson and for new high-mass resonances in pp collisions at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
studiesofzγproductioninassociation | Journal of High Energy Physics, 2017, 1 - 47. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2017)107 | Studies of Zγ production in association with a high-mass dijet system in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
studyofwwγandwzγproductioninppco | European Physical Journal C, 77, 1 - 30. ISSN 1434-6044. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5180-3 | Study of WWγ and WZγ production in pp collisions at √s = 8TeV and search for anomalous quartic gauge couplings with the ATLAS experiment | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
top-quarkmassmeasurementintheall-ha | Journal of High Energy Physics, 2017, 1 - 41. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2017)118 | Top-quark mass measurement in the all-hadronic tt¯ decay channel at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
heavyionresultsfromatlas | Nuclear Physics A: Nuclear and Hadronic Physics, 967, 51 - 58. ISSN 0375-9474. | Jia, J.Y.; Caron, S.; Chan, W.S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2017.05.076 | Heavy Ion Results from ATLAS | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchfortopquarkdecayst→qh,with | Journal of High Energy Physics, 2017, 1 - 43. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2017)129 | Search for top quark decays t → qH, with H → γγ, in √s = 13 TeV pp collisions using the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementofthew+w-productioncros | Physics Letters B, 773, 354 - 374. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.08.047 | Measurement of the W+ W- production cross section in pp collisions at a centre-of-mass energy of √s = 13 TeV with the ATLAS experiment | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementsofphoto-nuclearjetproduc | Nuclear Physics A: Nuclear and Hadronic Physics, 967, 277 - 280. ISSN 0375-9474. | Angerami, A.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysa.2017.06.041 | Measurements of photo-nuclear jet production in Pb plus Pb collisions with ATLAS | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofinclusiveanddifferentia | Journal of High Energy Physics, 2017, 1 - 49. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2017)132 | Measurement of inclusive and differential cross sections in the H -> ZZ* -> 4ℓ decay channel in pp collisions at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
combinationofd0measurementsoftheto | Physical Review D, 95, 1 - 11. ISSN 2470-0010. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.95.112004 | Combination of D0 measurements of the top quark mass | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
fiducial,totalanddifferentialcross-s | European Physical Journal C, 77, 1 - 46. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5061-9 | Fiducial, total and differential cross-section measurements of t-channel single top-quark production in pp collisions at 8TeV using data collected by the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
jetreconstructionandperformanceusing | European Physical Journal C, 77, 1 - 47. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5031-2 | Jet reconstruction and performance using particle flow with the ATLAS Detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
latticedesignandexpectedperformance | Physical Review. Accelerators and Beams, 20, 1 - 11. ISSN 2469-9888. | Bogomilov, M.; Filthaut, F.; Heidt, C.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevaccelbeams.20.063501 | Lattice design and expected performance of the Muon Ionization Cooling Experiment demonstration of ionization cooling | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 4 | (1.1) one exact match |
measurementofww/wz→ℓνqq′productionwi | European Physical Journal C, 77, 1 - 31. ISSN 1434-6044. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5084-2 | Measurement of WW/WZ→ℓνqq′ production with the hadronically decaying boson reconstructed as one or two jets in pp collisions at √s = 8 TeV with ATLAS, and constraints on anomalous gauge couplings | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementofw±w±vector-bosonscatter | Physical Review D, 96, 1 - 34. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.96.012007 | Measurement of W±W± vector-boson scattering and limits on anomalous quartic gauge couplings with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofforward-backwardmultipli | Physical Review C, 95, 1 - 30. ISSN 2469-9985. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.95.064914 | Measurement of forward-backward multiplicity correlations in lead-lead, proton-lead, and proton-proton collisions with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofjetfragmentationinpb+p | The European Physical Journal C: Particles and Fields, 77, 1 - 29. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4915-5 | Measurement of jet fragmentation in Pb+Pb and pp collisions at √sNN = 2.76 TeV with the ATLAS detector at the LHC | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofmulti-particleazimuthal | European Physical Journal C, 77, 1 - 40. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4988-1 | Measurement of multi-particle azimuthal correlations in pp, p plus Pb and low-multiplicity Pb plus Pb collisions with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofthecrosssectionforinc | Physics Letters B, 770, 473 - 493. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.04.072 | Measurement of the cross section for inclusive isolated-photon production in pp collisions at √s = 13 TeV using the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofthek(t)splittingscales | Journal of High Energy Physics, 2017, 1 - 41. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2017)026 | Measurement of the k(t) splitting scales in Z -> ll events in pp collisions at √s = 8TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementsofelectroweakwjjproduc | European Physical Journal C, 77, 1 - 74. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5007-2 | Measurements of electroweak W j j production and constraints on anomalous gauge couplings with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsofintegratedanddifferent | Physical Review D, 95, 1 - 27. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.95.112005 | Measurements of integrated and differential cross sections for isolated photon pair production in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsoflong-rangeazimuthalani | Physical Review C, 96, 1 - 37. ISSN 2469-9985. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, Nicolo de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.96.024908 | Measurements of long-range azimuthal anisotropies and associated Fourier coefficients for pp collisions at √s = 5.02 and 13 TeV and p plus Pb collisions at √sNN = 5.02 with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsoftheproductioncrosssec | The European Physical Journal C: Particles and Fields, 77, 1 - 31. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4900-z | Measurements of the production cross section of a Z boson in association with jets in pp collisions at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
performanceoftheatlastriggersystem | The European Physical Journal C: Particles and Fields, 77, 1 - 53. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4852-3 | Performance of the ATLAS trigger system in 2015 | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
precisionmeasurementandinterpretation | The European Physical Journal C: Particles and Fields, 77, 1 - 62. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4911-9 | Precision measurement and interpretation of inclusive W+, W−and Z/γ* production cross sections with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
reconstructionofprimaryverticesatth | The European Physical Journal C: Particles and Fields, 77, 1 - 35. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4887-5 | Reconstruction of primary vertices at the ATLAS experiment in Run 1 proton–proton collisions at the LHC | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfordarkmatterat√s=13tevin | European Physical Journal C, 77, 1 - 30. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4965-8 | Search for dark matter at √s = 13 TeV in final states containing an energetic photon and large missing transverse momentum with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfordirecttopsquarkpairproduc | Journal of High Energy Physics, 2017, 1 - 46. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2017)006 | Search for direct top squark pair production in events with a Higgs or Z boson, and missing transverse momentum in √s = 13 TeV pp collisions with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforthedimuondecayofthehiggs | Physical Review Letters, 119, 1 - 20. ISSN 0031-9007. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.119.051802 | Search for the Dimuon Decay of the Higgs Boson in pp Collisions at √s = 13 TeV with the ATLAS Detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
topologicalcellclusteringintheatlas | European Physical Journal C, 77, 1 - 73. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5004-5 | Topological cell clustering in the ATLAS calorimeters and its performance in LHC Run 1 | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
erratumto:measurementofthechargeas | European Physical Journal C, 77, 1 - 15. ISSN 1434-6044. | Aad, G.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-3910-6 | Erratum to: Measurement of the charge asymmetry in top-quark pair production in the lepton-plus-jets final state in pp collision data at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
electronefficiencymeasurementswithth | The European Physical Journal C: Particles and Fields, 77, 1 - 45. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4756-2 | Electron efficiency measurements with the ATLAS detector using 2012 LHC proton–proton collision data | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
high-etisolated-photonplusjetsproduc | Nuclear Physics B, 918, 257 - 316. ISSN 0550-3213. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysb.2017.03.006 | High-ET isolated-photon plus jets production in pp collisions at √s =8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofwbosonangulardistribut | Physics Letters B, 765, 132 - 153. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.12.005 | Measurement of W boson angular distributions in events with high transverse momentum jets at √s = 8 TeV using the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
ameasurementofthecalorimeterrespons | The European Physical Journal C: Particles and Fields, 77, 1 - 47. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4580-0 | A measurement of the calorimeter response to single hadrons and determination of the jet energy scale uncertainty using LHC Run-1 pp-collision data with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthepromptj/ψpairprodu | The European Physical Journal C: Particles and Fields, 77, 1 - 34. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4644-9 | Measurement of the prompt J/ψ pair production cross-section in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthett¯ztt¯zandtt¯wtt¯w | The European Physical Journal C: Particles and Fields, 77, 1 - 29. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, Nicolo de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4574-y | Measurement of the tt¯Ztt¯Z and tt¯Wtt¯W production cross sections in multilepton final states using 3.2 fb−1 of pp collisions at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforanomalouselectroweakproduct | Physical Review D, 95, 1 - 25. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.95.032001 | Search for anomalous electroweak production of WW/WZ in association with a high-mass dijet system in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfornewphenomenaineventsconta | The European Physical Journal C: Particles and Fields, 77, 1 - 40. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4700-5 | Search for new phenomena in events containing a same-flavour opposite-sign dilepton pair, jets, and large missing transverse momentum in √s = 13 TeV pp collisions with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfornewresonancesdecayingtoa | Physics Letters B, 765, 32 - 52. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, Nicolo de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.11.045 | Search for new resonances decaying to a W or Z boson and a Higgs boson in the ℓ+ℓ−bb¯, ℓνbb¯, and νν¯bb¯ channels with pp collisions at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftopquarkpolarizationin | Physical Review D, 95, 1 - 10. ISSN 2470-0010. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.95.011101 | Measurement of top quark polarization in t¯t lepton+jets final states | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementsoftop-quarkpairtoz-boso | Journal of High Energy Physics, 2017, 1 - 54. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2017)117 | Measurements of top-quark pair to Z-boson cross-section ratios at √s = 13, 8, 7 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementsofψ(2s)andx(3872)→j/ψπ | Journal of High Energy Physics, 2017, 1 - 43. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2017)117 | Measurements of ψ(2S) and X(3872) → J/ψπ + π − production in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofcharged-particledistribu | Journal of High Energy Physics, 2017, 1 - 42. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2017)157 | Measurement of charged-particle distributions sensitive to the underlying event in √s = 13 TeV proton-proton collisions with the ATLAS detector at the LHC | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofjetactivityproducedin | European Physical Journal C, 77, 1 - 38. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4766-0 | Measurement of jet activity produced in top-quark events with an electron, a muon and two b-tagged jets in the final state in pp collisions √s = 13TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofthewbosonpolarisation | European Physical Journal C, 77, 1 - 28. ISSN 1434-6044. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4819-4 | Measurement of the W boson polarisation in t(t)over-barevents from pp collisions at √s = 8 TeV in the lepton + jets channel with ATLAS | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthezzproductioncrosss | Journal of High Energy Physics, 2017, 1 - 53. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2017)099 | Measurement of the ZZ production cross section in proton-proton collisions at √s = 8 TeV using the ZZ → ℓ−ℓ+ℓ′−ℓ′+ and ZZ→ℓ−ℓ+νν¯¯¯ decay channels with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofthedirectcpviolatingc | Physical Review D, 95, 1 - 8. ISSN 2470-0010. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.95.031101 | Measurement of the direct CP violating charge asymmetry in B± → μ±νμD0 decays | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementofthet¯tproductioncross | Physical Review D, 95, 1 - 26. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.95.072003 | Measurement of the t¯t production cross section in the τ + jets final state in pp collisions at √s = 8 TeV using the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsofchargeandcpasymmetrie | Journal of High Energy Physics, 2017, 1 - 49. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2017)071 | Measurements of charge and CP asymmetries in b-hadron decays using top-quark events collected by the ATLAS detector in pp collisions at √s = 8 TeV | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementsoftopquarkspinobservabl | Journal of High Energy Physics, 2017, 1 - 50. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2017)113 | Measurements of top quark spin observables in tt¯ events using dilepton final states in √s = 8 TeV pp collisions with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
performanceofalgorithmsthatreconstru | The European Physical Journal C: Particles and Fields, 77, 1 - 46. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4780-2 | Performance of algorithms that reconstruct missing transverse momentum in √s = 8 TeV proton–proton collisions in the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
performanceoftheatlastransitionradi | Journal of Instrumentation, 12, 1 - 41. ISSN 1748-0221. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/12/05/p05002 | Performance of the ATLAS Transition Radiation Tracker in Run 1 of the LHC: tracker properties | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
probingthewtbvertexstructureint-c | Journal of High Energy Physics, 2017, 1 - 50. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2017)124 | Probing the W tb vertex structure in t-channel single-top-quark production and decay in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforlepton-flavour-violatingdeca | The European Physical Journal C: Particles and Fields, 77, 1 - 31. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4624-0 | Search for lepton-flavour-violating decays of the Higgs and Z bosons with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfortribosonw±w±w∓productionin | The European Physical Journal C: Particles and Fields, 77, 1 - 28. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-4692-1 | Search for triboson W±W±W∓ production in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofjetptcorrelationsinpb | Physics Letters B, 774, 379 - 402. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.09.078 | Measurement of jet pT correlations in Pb+Pb and pp collisions at √sNN = 2.76 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforheavyhiggsbosonsa/hdecayi | Physical Review Letters, 119, 1 - 20. ISSN 0031-9007. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Fabiani, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.119.191803 | Search for Heavy Higgs Bosons A/H Decaying to a Top Quark Pair in pp Collisions at √s = 8 TeV with the ATLAS Detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchfornewphenomenainhigh-massdi | Physics Letters B, 775, 105 - 125. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.10.039 | Search for new phenomena in high-mass diphoton final states using 37 fb-1 of proton-proton collisions collected at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
correctionto:identificationandreject | The European Physical Journal C: Particles and Fields, 77, 1 - 14. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5245-3 | Correction to: Identification and rejection of pile-up jets at high pseudorapidity with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfornewhigh-massphenomenainth | Journal of High Energy Physics, 2017, 1 - 61. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2017)182 | Search for new high-mass phenomena in the dilepton final state using 36 fb−1 of proton-proton collision data at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementofb-hadronpairproduction | Journal of High Energy Physics, 2017, 1 - 51. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2017)062 | Measurement of b-hadron pair production with the ATLAS detector in proton-proton collisions at √s = 8 TeV | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementofdetector-correctedobserv | The European Physical Journal C: Particles and Fields, 77, 1 - 31. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5315-6 | Measurement of detector-corrected observables sensitive to the anomalous production of events with jets and large missing transverse momentum in pp collisions at √s = 13 TeV using the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofleptondifferentialdistr | The European Physical Journal C: Particles and Fields, 77, 1 - 66. ISSN 1434-6052. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5349-9 | Measurement of lepton differential distributions and the top quark mass in tt¯ production in pp collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofthett¯γproductioncross | Journal of High Energy Physics, 2017, 1 - 43. ISSN 1126-6708. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2017)086 | Measurement of the tt¯γ production cross section in proton-proton collisions at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
performanceoftheatlastrackreconstru | The European Physical Journal C: Particles and Fields, 77, 1 - 30. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5225-7 | Performance of the ATLAS track reconstruction algorithms in dense environments in LHC Run 2 | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
corrigendumto:“measurementofthet¯tp | Physics Letters B, 772, 1 - 1. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.09.027 | Corrigendum to: “Measurement of the t¯tproduction cross-section using eμevents with b-tagged jets in ppcollisions at √s = 13TeV with the ATLAS detector” [Phys. Lett. B 761 (2016) 136–157] | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
studyoforderedhadronchainswiththe | Physical Review D, 96, 1 - 31. ISSN 2470-0010. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.96.092008 | Study of ordered hadron chains with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
analysisofthewtbvertexfromthemeas | Journal of High Energy Physics, 2017, 1 - 60. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2017)017 | Analysis of the Wtb vertex from the measurement of triple-differential angular decay rates of single top quarks produced in the t-channel at √s = 8 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
evidencefortheh→bb¯¯decaywiththea | Journal of High Energy Physics, 2017, 1 - 71. ISSN 1126-6708. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Besjes, G.J.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; Zwalinski, L. | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2017)024 | Evidence for the H→bb¯¯ decay with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 21 | (1.1) one exact match |
measurementofthedrell-yantriple-diff | Journal of High Energy Physics, 2017, 1 - 80. ISSN 1126-6708. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Bakker, P.J.C.; Besjes, G.J.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Navarro, J.; Goossens, L.M.; Igonkina, O.; Konig, A.C.; Kupfer, T.; Nektarijevic, S.; Puri, A.; Rossi, L.; Schouwenberg, J.F.P.; Strubig, A.; Urban, J.; Vazquez Schröder, T.; Voss, R.; Yu, J.; Zhao, Y.; Zhao, Z.; Zwalinski, L. | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2017)059 | Measurement of the Drell-Yan triple-differential cross section in pp collisions at √s = 8 TeV | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 33 | (1.1) one exact match |
searchfornewphenomenawithlargejet | Journal of High Energy Physics, 2017, 1 - 52. ISSN 1126-6708. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Abidi, S.H.; Alderweireldt, S.C.; Besjes, G.J.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; Goossens, L.M.; Igonkina, O.; Konig, A.C.; Kupfer, T.; Nektarijevic, S.; Puri, A.; Rossi, L.; Schouwenberg, J.F.P.; Strubig, A.; Urban, J.; Vazquez Schröder, T.; Voss, R.; Yu, J.; Zhao, Y.; Zhao, Z.; Zwalinski, L. | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2017)034 | Search for new phenomena with large jet multiplicities and missing transverse momentum using large-radius jets and flavour-tagging at ATLAS in 13 TeV pp collisions | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 31 | (1.1) one exact match |
determinationofthestrongcouplingcon | The European Physical Journal C: Particles and Fields, 77, 1 - 34. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-017-5442-0 | Determination of the strong coupling constant αs from transverse energy–energy correlations in multijet events at √s = 8 TeV using the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
femtoscopywithidentifiedchargedpions | Physical Review C, 96, 1 - 38. ISSN 2469-9985. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.96.064908 | Femtoscopy with identified charged pions in proton-lead collisions at √sNN = 5.02 TeV with ATLAS | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforsquarksandgluinosinevents | Physical Review C, 96, 1 - 37. ISSN 2469-9985. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Fabiani, V.; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.96.112010 | Search for squarks and gluinos in events with an isolated lepton, jets, and missing transverse momentum at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
studyofthematerialoftheatlasinner | Journal of Instrumentation, 12, 1 - 59. ISSN 1748-0221. | Aaboud, M.; Aad, G.; Abbott, B.; Abdallah, J.; Abdinov, O.; Abeloos, B.; Caron, S.; Colasurdo, L.; Croft, V.; Fabiani, V.; Filthaut, F.; Groot, N. de; Galea, C.; Koletsou, I.; Konig, A.C.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; Zwalinski, L.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/12/12/p12009 | Study of the material of the ATLAS inner detector for Run 2 of the LHC | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
measurementofthecross-sectionforele | Physics Letters B, 775, 206 - 228. ISSN 0370-2693. | Aaboud, M.; Alderweireldt, S.C.; Caron, S.; Colasurdo, L.; Croft, V.; Fabiani, V.; Filthaut, F.; Galea, C.; Groot, N. de; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; et al., | 2017 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2017.10.040 | Measurement of the cross-section for electroweak production of dijets in association with a Z boson in pp collisions at √s = 13 TeV with the ATLAS detector | 2017 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementoftheinclusivett¯product | Physical Review D, 94, 1 - 21. ISSN 2470-0010. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Zivkovic, L.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.092004 | Measurement of the inclusive tt¯ production cross section in pp¯ collisions at √s = 1.96 TeV and determination of the top quark pole mass | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 6 | (1.1) one exact match |
measurementofexclusiveγγ→w+w−product | Physical Review D, 94, 1 - 32. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.032011 | Measurement of exclusive γγ→W+W− production and search for exclusive Higgs boson production in pp collisions at √s = 8 TeV using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
erratum:searchformassivesupersymmetr | Physical Review D, 93, 1 - 1. ISSN 2470-0010. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.039901 | Erratum: Search for massive supersymmetric particles decaying to many jets using the ATLAS detector in pp collisions at √s = 8 TeV [Phys. Rev. D 91, 112016 (2015)] | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
luminositydeterminationinppcollision | The European Physical Journal C: Particles and Fields, 76, 1 - 45. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4466-1 | Luminosity determination in pp collisions at √s = 8 TeV using the ATLAS detector at the LHC | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthecp-violatingphaseϕs | Journal of High Energy Physics, 2016, 1 - 45. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2016)147 | Measurement of the CP-violating phase ϕs and the Bs0 meson decay width difference with Bs0 → J/ψϕ decays in ATLAS | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthebb¯¯dijetcrosssect | The European Physical Journal C: Particles and Fields, 76, 1 - 24. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4521-y | Measurement of the bb¯¯ dijet cross section in pp collisions at √s = 7 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftopquarkpairdifferenti | Physical Review D, 94, 1 - 33. ISSN 2470-0010. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.092003 | Measurement of top quark pair differential cross sections in the dilepton channel in pp collisions at √s = 7 and 8 TeV with ATLAS | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementsofthehiggsbosonproducti | Journal of High Energy Physics, 2016, 1 - 113. ISSN 1126-6708. | Aad, G.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2016)045 | Measurements of the Higgs boson production and decay rates and constraints on its couplings from a combined ATLAS and CMS analysis of the LHC pp collision data at √s = 7 and 8 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
performanceofpile-upmitigationtechni | The European Physical Journal C: Particles and Fields, 76, 1 - 36. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Pastore, F.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4395-z | Performance of pile-up mitigation techniques for jets in pp collisions at √s = 8 TeV using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
publisher’snote:searchforviolationo | Physical Review Letters, 116, 1 - 1. ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.116.019901 | Publisher’s Note: Search for Violation of CPT and Lorentz Invariance in B0s Meson Oscillations [Phys. Rev. Lett. , 161601 (2015)] | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
searchforgluinosineventswithaniso | The European Physical Journal C: Particles and Fields, 76, 1 - 29. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4397-x | Search for gluinos in events with an isolated lepton, jets and missing transverse momentum at √s = 13 Te V with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforminimalsupersymmetricstanda | The European Physical Journal C: Particles and Fields, 76, 1 - 30. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4400-6 | Search for minimal supersymmetric standard model Higgs Bosons H / A and for a Z′ boson in the ττ final state produced in pp collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
addendumto‘measurementofthett¯prod | The European Physical Journal C: Particles and Fields, 76, 1 - 14. ISSN 1434-6052. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4501-2 | Addendum to ‘Measurement of the tt¯ production cross-section using eμ events with b-tagged jets in pp collisions at √s = 7 and 8 TeV with the ATLAS detector’ | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
ameasurementofmaterialintheatlast | Journal of Instrumentation, 11, 1 - 41. ISSN 1748-0221. | Aaboud, A.; Caron, S.; Colasurdo, L.; Croft, V.; Jong, S.J. de; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/11/11/p11020 | A measurement of material in the ATLAS tracker using secondary hadronic interactions in 7 TeV pp collisions | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsoffiducialcross-sections | European Physical Journal C, 76, 1 - 37. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3852-4 | Measurements of fiducial cross-sections for tt¯ production with one or two additional b-jets in pp collisions at √s = 8 TeV using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementsoffour-leptonproductioni | Physics Letters B, 753, 552 - 572. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.12.048 | Measurements of four-lepton production in pp collisions at √s = 8 teV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
precisemeasurementofthetopquarkmas | Physics Letters B, 752, 18 - 26. ISSN 0370-2693. | Abazov, V.M.; de Jong, S.J.; Filthaut, F.; Meijer, M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.10.086 | Precise measurement of the top quark mass in dilepton decays using optimized neutrino weighting | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
searchforahigh-masshiggsbosondecay | Journal of High Energy Physics, 2016, 1 - 66. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2016)032 | Search for a high-mass Higgs boson decaying to a W boson pair in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforanadditional,heavyhiggsbo | European Physical Journal C, 76, 1 - 42. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3820-z | Search for an additional, heavy Higgs boson in the H→ZZ decay channel at √s = 8 TeV in pp collision data with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforinvisibledecaysofahiggsb | Journal of High Energy Physics, 2016, 1 - 44. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2016)172 | Search for invisible decays of a Higgs boson using vector-boson fusion in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfornewphenomenaindijetmassa | Physics Letters B, 754, 302 - 322. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.01.032 | Search for new phenomena in dijet mass and angular distributions from pp collisions √s = 13 TeV with the ATLAS Detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchesforscalarleptoquarksinppco | European Physical Journal C, 76, 1 - 28. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3823-9 | Searches for scalar leptoquarks in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
studyoftheb_c+→j/ψd_s+andb_c^+ | European Physical Journal C, 76, 1 - 24. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3743-8 | Study of the B_c^+ → J/ψ D_s^+ and B_c^+ → J/ψ D_s^{*+} decays with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
constraintsonnon-standardmodelhiggs | Physics Letters B, 753, 69 - 85. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.11.071 | Constraints on non-Standard Model Higgs boson interactions in an effective Lagrangian using differential cross sections measured in the H → γγ decay channel at with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
dijetproductionin√s=7tevppcollis | Physics Letters B, 754, 214 - 234. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.01.028 | Dijet production in √s = 7 TeV pp collisions with large rapidity gaps at the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthecorrelationbetweent | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.012002 | Measurement of the correlation between the polar angles of leptons from top quark decays in the helicity basis at √s=7 TeV using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftheforward-backwardasym | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93. ISSN 1550-7998. | Abazov, V.M.; de Jong, S.J.; Filthaut, F.; Meijer, M.M.; Zivkovic, L.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.032002 | Measurement of the forward-backward asymmetry of asymmetry of Λ and Λ¯ production in pp¯ collisions | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 6 | (1.1) one exact match |
anewmethodtodistinguishhadronically | The European Physical Journal C: Particles and Fields, 76, 1 - 33. ISSN 1434-6052. | Aad, G.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4065-1 | A new method to distinguish hadronically decaying boosted Z bosons from W bosons using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
identificationofboosted,hadronically | European Physical Journal C, 76, 1 - 47. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-3978-z | Identification of boosted, hadronically decaying W bosons and comparisons with ATLAS data taken at √s = 8 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofjetchargeindijetevent | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93, 1 - 35. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.052003 | Measurement of jet charge in dijet events from √s = 8 TeV pp collisions with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofspincorrelationbetween | Physics Letters B, 757, 199 - 206. ISSN 0370-2693. | Abazov, V.M.; de Jong, S.J.; Filthaut, F.; Meijer, M.M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.03.053 | Measurement of spin correlation between top and antitop quarks produced in pp¯ collisions at √s = 1.96 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementofthecentralitydependence | European Physical Journal C, 76, 1 - 30. ISSN 1434-6044. | Aad, G.; Besjes, G.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; Konig, A.; Salvucci, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4002-3 | Measurement of the centrality dependence of the charged-particle pseudorapidity distribution in proton-lead collisions at √s—-NN = 5.02 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthechargeasymmetryinh | Physics Letters B, 756, 52 - 71. ISSN 0370-2693. | Aad, G.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.02.055 | Measurement of the charge asymmetry in highly boosted top-quark pair production in √s = 8 TeV pp collision data collected by the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
measurementofthedependenceoftransve | Physics Letters B, 756, 10 - 28. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.02.056 | Measurement of the dependence of transverse energy production at large pseudorapidity on the hard-scattering kinematics of proton–proton collisions at √s=2.76 TeV with ATLAS | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
asearchforpromptlepton-jetsinppco | Journal of High Energy Physics, 2016, 1 - 51. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2016)062 | A search for prompt lepton-jets in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthedifferentialcross-se | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93, 1 - 34. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.032009 | Measurement of the differential cross-section of highly boosted top quarks as a function of their transverse momentum in √s = 8 TeV proton-proton collisions using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementsofw±zproductioncrosssec | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93, 1 - 36. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.092004 | Measurements of W±Z production cross sections in pp collisions at √s = 8 TeV with the ATLAS detector and limits on anomalous gauge boson self-couplings | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
observationoflong-rangeellipticazimu | Physical Review Letters, 116, 1 - 20. ISSN 0031-9007. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.116.172301 | Observation of Long-Range Elliptic Azimuthal Anisotropies in √s = 13 and 2.76 TeV pp Collisions with the ATLAS Detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
performanceofb-jetidentificationint | Journal of Instrumentation, 11, 1 - 127. ISSN 1748-0221. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/11/04/p04008 | Performance of b-jet identification in the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
pioncontaminationinthemicemuonbeam | Journal of Instrumentation, 11, 1 - 16. ISSN 1748-0221. | Adams, D.; Filthaut, F.; Zisman, M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/11/03/p03001 | Pion contamination in the MICE muon beam | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 4 | (1.1) one exact match |
probingleptonflavourviolationvianeu | European Physical Journal C, 76, 1 - 25. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4041-9 | Probing lepton flavour violation via neutrinoless τ −→ 3μ decays with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforanomalouscouplingsinthew | Journal of High Energy Physics, 2016, 1 - 46. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2016)023 | Search for anomalous couplings in the W tb vertex from the measurement of double differential angular decay rates of single top quarks produced in the t-channel with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforchargedhiggsbosonsintheh | Journal of High Energy Physics, 2016, 1 - 48. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2016)127 | Search for charged Higgs bosons in the H ± → tb decay channel in pp collisions at √s = 8 TeV using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfornewphenomenawithphoton+jet | Journal of High Energy Physics, 2016, 1 - 37. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2016)041 | Search for new phenomena with photon+jet events in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforsingletop-quarkproductionv | European Physical Journal C, 76, 1 - 30. ISSN 1434-6044. | Aad, G.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-3876-4 | Search for single top-quark production via flavour-changing neutral currents at 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
centrality,rapidity,andtransversemom | Physical Review C. Nuclear Physics, 93, 1 - 28. ISSN 0556-2813. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; Konig, A.; Salvucci, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.93.034914 | Centrality, rapidity, and transverse momentum dependence of isolated prompt photon production in lead-lead collisions at √sNN = 2.76 TeV measured sth the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforstronggravityinmultijetfi | Journal of High Energy Physics, 2016, 1 - 38. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2016)026 | Search for strong gravity in multijet final states produced in pp collisions at root √s = 13 TeV using the ATLAS detector at the LHC | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforsupersymmetryat√s=13tev | The European Physical Journal C: Particles and Fields, 76, 1 - 26. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4095-8 | Search for supersymmetry at √s = 13 TeV in final states with jets and two same-sign leptons or three leptons with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfortheelectroweakproductionof | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93, 1 - 50. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.052002 | Search for the electroweak production of supersymmetric particles in √s=8 TeV pp collisions with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfortheproductionofsinglevect | Journal of High Energy Physics, 2016, 1 - 46. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2016)110 | Search for the production of single vector-like and excited quarks in the Wt nal state in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
studyofdoublepartoninteractionsind | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93, 1 - 14. ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.052008 | Study of double parton interactions in diphoton plus dijet events in pp¯ collisions at √s = 1.96 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
combinationofsearchesforww,wz,and | Physics Letters B, 755, 285 - 305. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.02.015 | Combination of searches for WW, WZ, and ZZ resonances in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
evidenceforsimultaneousproductionof | Physical Review Letters, 116. ISSN 0031-9007. | Abazov, V.M.; de Jong, S.J.; Filthaut, F.; Meijer, M.M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.116.082002 | Evidence for Simultaneous Production of J/ψ and Υ Mesons | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
evidenceforsingletop-quarkproduction | Physics Letters B, 756, 228 - 246. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.03.017 | Evidence for single top-quark production in the s-channel in proton–proton collisions at √s = 8 TeV with the ATLAS detector using the Matrix Element Method | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
darkmatterinterpretationsofatlassea | Journal of High Energy Physics, 2016, 1 - 44. ISSN 1126-6708. | Aaboud, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2016)175 | Dark matter interpretations of ATLAS searches for the electroweak production of supersymmetric particles in √s = 8 TeV proton-proton collisions | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
erratumto:atlasrun1searchesfordir | The European Physical Journal C: Particles and Fields, 76, 1 - 14. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-3935-x | Erratum to: ATLAS Run 1 searches for direct pair production of third-generation squarks at the Large Hadron Collider ATLAS Collaboration | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofevent-shapeobservablesi | European Physical Journal C, 76, 1 - 40. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4176-8 | Measurement of event-shape observables in Z→ℓ+ℓ− events in pp collisions at √s = 7 TeV with the ATLAS detector at the LHC | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
charged-particledistributionsatlowtr | The European Physical Journal C: Particles and Fields, 76, 1 - 22. ISSN 1434-6052. | Aaboud, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4335-y | Charged-particle distributions at low transverse momentum in √s = 13 TeV pp interactions measured with the ATLAS detector at the LHC | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofjetactivityintopquark | Journal of High Energy Physics, 2016, 1 - 62. ISSN 1126-6708. | Aaboud, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2016)074 | Measurement of jet activity in top quark events using the eμ final state with two b-tagged jets in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthew±zbosonpair-produc | Physics Letters B, 762, 1 - 22. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.08.052 | Measurement of the W±Z boson pair-production cross section in pp collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftheangularcoefficients | Journal of High Energy Physics, 2016, 1 - 101. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2016)159 | Measurement of the angular coefficients in Z-boson events using electron and muon pairs from data taken at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthetotalcrosssectionf | Physics Letters B, 761, 158 - 178. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.08.020 | Measurement of the total cross section from elastic scattering in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthettbarproductioncro | Physics Letters B, 761, 136 - 157. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.08.019 | Measurement of the tt bar production cross-section using eμ events with b-tagged jets in pp collisions at √s = 13TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftotalanddifferentialw+ | Journal of High Energy Physics, 2016, 1 - 81. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2016)029 | Measurement of total and differential W+ W- production cross sections in proton-proton collisions at √s = 8 TeV with the ATLAS detector and limits on anomalous triple-gauge-boson couplings | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementsofthechargeasymmetryin | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 94, 1 - 31. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.032006 | Measurements of the charge asymmetry in top-quark pair production in the dilepton final state at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforhiggsandzbosondecaystoϕ | Physical Review Letters, 117, 1 - 19. ISSN 0031-9007. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.117.111802 | Search for Higgs and Z Boson Decays to ϕγ with the ATLAS Detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforbottomsquarkpairproduction | The European Physical Journal C: Particles and Fields, 76, 1 - 25. ISSN 1434-6052. | Aaboud, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4382-4 | Search for bottom squark pair production in proton–proton collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforhigh-massnewphenomenainth | Physics Letters B, 761, 372 - 392. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.08.055 | Search for high-mass new phenomena in the dilepton final state using proton–proton collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfornewphenomenaindifferent-fl | The European Physical Journal C: Particles and Fields, 76, 1 - 28. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4385-1 | Search for new phenomena in different-flavour high-mass dilepton final states in pp collisions at √s = 13 Tev with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfornewresonancesineventswith | Physics Letters B, 762, 334 - 352. ISSN 0370-2693. | Aaboud, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.09.040 | Search for new resonances in events with one lepton and missing transverse momentum in pp collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforresonancesindiphotonevents | Journal of High Energy Physics, September, 1 - 50. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2016)001 | Search for resonances in diphoton events at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforscalarleptoquarksinppcoll | New Journal of Physics, 18, 1 - 25. ISSN 1367-2630. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1367-2630/18/9/093016 | Search for scalar leptoquarks in pp collisions at √s = 13TeV with the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforsupersymmetryinafinalstat | The European Physical Journal C: Particles and Fields, 76, 1 - 23. ISSN 1434-6052. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4344-x | Search for supersymmetry in a final state containing two photons and missing transverse momentum in √s = 13 TeV pp collisions at the LHC using the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfortopsquarksinfinalstatesw | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 94, 1 - 32. ISSN 1550-7998. | Aaboud, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.052009 | Search for top squarks in final states with one isolated lepton, jets, and missing transverse momentum in √s = 13 TeV pp collisions with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchesforheavydibosonresonancesin | Journal of High Energy Physics, 2016, 1 - 46. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2016)173 | Searches for heavy diboson resonances in pp collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
studyoftheraredecaysofb0sandb0i | The European Physical Journal C: Particles and Fields, 76, 1 - 31. ISSN 1434-6052. | Aaboud, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4338-8 | Study of the rare decays of B0s and B0 into muon pairs from data collected during the LHC Run 1 with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
theperformanceofthejettriggerfort | The European Physical Journal C: Particles and Fields, 76, 1 - 47. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4325-0 | The performance of the jet trigger for the ATLAS detector during 2011 data taking | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
transversemomentum,rapidity,andcentr | Physics Letters B, 763, 313 - 336. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.10.053 | Transverse momentum, rapidity, and centrality dependence of inclusive charged-particle production in √sNN =5.02 TeV p +Pb collisions measured by the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
charged-particledistributionsinppint | European Physical Journal C, 76, 1 - 32. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4203-9 | Charged-particle distributions in pp interactions at √s = 8TeV measured with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
charged-particledistributionsin√s=1 | Physics Letters B, 758, 67 - 88. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.04.050 | Charged-particle distributions in √s = 13 TeV pp interactions measured with the ATLAS detector at the LHC | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
evidenceforab0sπ±state | Physical Review Letters, 117, 1 - 8. ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.117.022003 | Evidence for a B0sπ± State | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
identificationofhightransversemoment | Journal of High Energy Physics, 2016, 1 - 81. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2016)093 | Identification of high transverse momentum top quarks in pp collisions at √s = 8 TeV TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofd∗±,d±andd±smesonprod | Nuclear Physics B, 907, 717 - 763. ISSN 0550-3213. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Konig, A.; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nuclphysb.2016.04.032 | Measurement of D∗±, D±and D±s meson production cross sections in ppcollisions at √s = 7 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofw±andz-bosonproduction | Physics Letters B, 759, 601 - 621. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.06.023 | Measurement of W± and Z-boson production cross sections in pp collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthecharged-particlemult | The European Physical Journal C: Particles and Fields, 76, 1 - 23. ISSN 1434-6052. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4126-5 | Measurement of the charged-particle multiplicity inside jets from √s = 8 TeV pp collisions with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthedouble-differentialh | Journal of High Energy Physics, 2016, 1 - 61. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2016)009 | Measurement of the double-differential high-mass Drell-Yan cross section in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
asearchforanexcitedmuondecayingto | New Journal of Physics, 18, 1 - 22. ISSN 1367-2630. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1367-2630/18/7/073021 | A search for an excited muon decaying to a muon and two jets in pp collisions at √s = 8 with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftheinclusiveisolatedpr | Journal of High Energy Physics, 2016, 1 - 42. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2016)005 | Measurement of the inclusive isolated prompt photon cross section in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftherelativewidthdiffer | Journal of High Energy Physics, 2016, 1 - 39. ISSN 1126-6708. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2016)081 | Measurement of the relative width difference of the B0-B¯¯0 system with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthetopquarkmassusing | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 94, 1 - 15. ISSN 1550-7998. | Abazov, V.M.; de Jong, S.J.; Filthaut, F.; Meijer, M.M.; Zivkovic, L.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.032004 | Measurement of the top quark mass using the matrix element technique in dilepton final states | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 6 | (1.1) one exact match |
measurementofthetransversemomentuma | European Physical Journal C, 76, 1 - 61. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4070-4 | Measurement of the transverse momentum and φ*η distributions of Drell-Yan lepton pairs in proton-proton collisions at √s=8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementsofzγandzγγproductionin | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93, 1 - 41. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.112002 | Measurements of Zγ and Zγγ production in pp collisions at √s = 8 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
muonreconstructionperformanceofthea | European Physical Journal C, 76, 1 - 30. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4120-y | Muon reconstruction performance of the ATLAS detector in proton-proton collision data at root √s = 13 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
reconstructionofhadronicdecayproduct | European Physical Journal C, 76, 1 - 26. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-016-4110-0 | Reconstruction of hadronic decay products of tau leptons with the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
asearchfortopsquarkswithr-parity-v | Journal of High Energy Physics, 2016, 1 - 49. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2016)067 | A search for top squarks with R-parity-violating decays to all-hadronic final states with the ATLAS detector in √s = 8 TeV proton-proton collisions | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfortev-scalegravitysignatures | Physics Letters B, 760, 520 - 537. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.07.030 | Search for TeV-scale gravity signatures in high-mass final states with leptons and jets with the ATLAS detector at √s = 13 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforchargedhiggsbosonsproduced | Physics Letters B, 759, 555 - 574. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.06.017 | Search for charged Higgs bosons produced in association with a top quark and decaying via H± → τν using pp collision data recorded at √s = 13 TeV by the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchformetastableheavychargedpart | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 93, 1 - 25. ISSN 1550-7998. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.93.112015 | Search for metastable heavy charged particles with large ionization energy loss in pp collisions at √s = 13 TeV using the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforpairproductionofgluinosde | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 94, 1 - 32. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.032003 | Search for pair production of gluinos decaying via stop and sbottom in events with b-jets and large missing transverse momentum in pp collisions at √s = 13 TeV with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforsingleproductionofavector | Physics Letters B, 758, 249 - 268. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.04.061 | Search for single production of a vector-like quark via a heavy gluon in the 4b final state with the ATLAS detector in pp collisions at √s=8 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
b0slifetimemeasurementinthecp-oddd | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 94, 1 - 7. ISSN 1550-7998. | Abazov, V.M.; de Jong, S.J.; Filthaut, F.; Meijer, M.M.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.94.012001 | B0s lifetime measurement in the CP-odd decay channel B0s→J/ψ f0(980) | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
beam-inducedandcosmic-raybackgrounds | Journal of Instrumentation, 11, 1 - 78. ISSN 1748-0221. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/11/05/p05013 | Beam-induced and cosmic-ray backgrounds observed in the ATLAS detector during the LHC 2012 proton-proton running period | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofw+w−productioninassoci | Physics Letters B, 763, 114 - 133. ISSN 0370-2693. | Aaboud, M.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2016.10.014 | Measurement of W+W− production in association with one jet in proton–proton collisions at with the ATLAS detector | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementoffiducialdifferentialcro | Journal of High Energy Physics, 2016, 1 - 63. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.; Nektarijevic, S.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2016)104 | Measurement of fiducial differential cross sections of gluon-fusion production of Higgs bosons decaying to WW ∗→eνμν with the ATLAS detector at √s = 8 TeV | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
studyofharddouble-partonscatteringi | Journal of High Energy Physics, 2016, 1 - 52. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Igonkina, O.; König, A.C; Nektarijevic, S.; Schouwenberg, J.F.P.; Strubig, A.; et al., | 2016 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2016)110 | Study of hard double-parton scattering in four-jet events in pp collisions at √s = 7 TeV with the ATLAS experiment | 2016 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofcolourflowwiththejet | Physics Letters B, 750, 475 - 493. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.09.051 | Measurement of colour flow with the jet pull angle in tt¯ events using the ATLAS detector at √s = 8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthebranchingratioγ(λ0b | Physics Letters B, 751, 63 - 80. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.10.009 | Measurement of the branching ratio Γ(Λ0b→ψ(2S)Λ0)/Γ(Λ0b→J/ψΛ0) with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftransverseenergy-energy | Physics Letters B, 750, 427 - 447. ISSN 0370-2693. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.09.050 | Measurement of transverse energy-energy correlations in multi-jet events in pp collisions at √s = 7 TeV using the ATLAS detector and determination of the strong coupling constant αs(mZ) | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchesforhiggsbosonpairproduction | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.092004 | Searches for Higgs boson pair production in the hh→bbττ, γγWW*, γγbb, bbbb channels with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
summaryofthesearchesforsquarksand | Journal of High Energy Physics, October. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2015)054 | Summary of the searches for squarks and gluinos using √s=8 TeV pp collisions with the ATLAS experiment at the LHC | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
electron-muonranger:performanceinthe | Journal of Instrumentation, 10. ISSN 1748-0221. | Adams, D.; Filthaut, F.; Zisman, M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/10/12/p12012 | Electron-muon ranger: performance in the MICE muon beam | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 4 | (1.1) one exact match |
erratum:measurementofthewbosonprod | Physical Review Letters, 114. ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.049901 | Erratum: Measurement of the W Boson Production Charge Asymmetry in pp¯→W+X→eν+X Events at √s=1.96 TeV [Phys. Rev. Lett. 112, 151803 (2014)] | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
erratum:measurementsofwγandzγprodu | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Chelstowska, M.A.; Groot, N. de; Filthaut, F.; Klok, P.F.; Koetsveld, F.; Konig, A.C.; Raas, M.; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.119901 | Erratum: Measurements of Wγ and Zγ production in pp collisions at √s=7 TeV with the ATLAS detector at the LHC [Phys. Rev. D 87, 112003 (2013)] | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
erratum:searchfornewphenomenaineve | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.059903 | Erratum: Search for new phenomena in events with a photon and missing transverse momentum in pp collisions at √s=8 TeV with the ATLAS detector [Phys. Rev. D 91, 012008 (2015)] | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
determinationoftheratioofb-quarkfr | Physical Review Letters, 115. ISSN 0031-9007. | Aad, G.; Caron, S.; Colasurdo, L.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.262001 | Determination of the Ratio of b-Quark Fragmentation Fractions fs/fd in pp Collisions at √s=7 TeV with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
evidenceforthehiggs-bosonyukawacoup | Journal of High Energy Physics, 2015, 1 - 74. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2015)117 | Evidence for the Higgs-boson Yukawa coupling to tau leptons with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofspincorrelationintop-a | Physical Review Letters, 114, 142001. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.142001 | Measurement of Spin Correlation in Top-Antitop Quark Events and Search for Top Squark Pair Production in pp Collisions at √s=8 TeV Using the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementoftheb0slifetimeinthef | Physical Review Letters, 114. ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.062001 | Measurement of the B0s Lifetime in the Flavor-Specific Decay Channel B0s→D−sμ+νX | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementoftheelectronchargeasymm | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.032007 | Measurement of the electron charge asymmetry in pp¯→W+X→eν+X decays in pp¯ collisions at √s = 1.96 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementoftheratioofinclusivecr | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91, 1 - 9. ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.052010 | Measurement of the ratio of inclusive cross sections σ(pp¯→Z+2 b jets)/σ(pp¯→Z+2 jets) in pp¯ collisions at √s=1.96 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementofthetop-quarkmassinthe | European Physical Journal C, 75, 1 - 26. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3373-1 | Measurement of the top-quark mass in the fully hadronic decay channel from ATLAS data at √s=7 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementoftheφ*ηdistributionofm | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.072002 | Measurement of the φ*η distribution of muon pairs with masses between 30 and 500 GeV in 10.4 fb−1 of pp¯ collisions | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementsofthenuclearmodification | Physical Review Letters, 114, 072302. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.072302 | Measurements of the Nuclear Modification Factor for Jets in Pb plus Pb Collisions at √SNN=2.76 TeV with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementsofthewproductioncrosss | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3262-7 | Measurements of the W production cross sections in association with jets with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
observationoftop-quarkpairproduction | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.072007 | Observation of top-quark pair production in association with a photon and measurement of the tt¯γ production cross section in pp collisions at √s=7 TeV using the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
performanceoftheatlasmuontriggerin | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3325-9 | Performance of the ATLAS muon trigger in pp collisions at √s=8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforscalarcharmquarkpairprodu | Physical Review Letters, 114. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.161801 | Search for Scalar Charm Quark Pair Production in pp Collisions at √s=8 TeV with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforw′→tb→qqbbdecaysinppcolli | European Physical Journal C, 75, 1 - 23. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3372-2 | Search for W′→tb→qqbb decays in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforacp-oddhiggsbosondecaying | Physics Letters B, 744, 163 - 183. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.03.054 | Search for a CP-odd Higgs boson decaying to Zh in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforanomalousproductionofpromp | Journal of High Energy Physics, 2015. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2015)041 | Search for anomalous production of prompt same-sign lepton pairs and pair-produced doubly charged Higgs bosons with root √s=8 TeV pp collisions using the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfordarkmatterineventswithhe | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3306-z | Search for dark matter in events with heavy quarks and missing transverse momentum in pp collisions with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforinvisibleparticlesproduced | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-3233-4 | Search for invisible particles produced in association with single-top-quarks in proton–proton collisions at at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchfornewphenomenainthedijetma | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.052007 | Search for new phenomena in the dijet mass distribution using p−p collision data at √s=8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforresonantdibosonproductioni | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3261-8 | Search for resonant diboson production in the ℓℓqq¯ final state in pp collisions at √s=8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
simultaneousmeasurementsofthett¯,w+ | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.052005 | Simultaneous measurements of the tt¯, W+W−, and Z/γ∗→ττ production cross-sections in pp collisions at √s=7 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
asearchforhigh-massresonancesdecayi | Journal of High Energy Physics. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2015)157 | A search for high-mass resonances decaying to τ+τ− in pp collisions at √s=8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
erratum:measurementoftheelectroncha | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.079901 | Erratum: Measurement of the electron charge asymmetry in pp¯→W+X→eν+X decays in pp¯ collisions at √s=1.96 TeV [Phys. Rev. D 91, 032007 (2015)] | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
evidenceofwγγproductioninppcollisi | Physical Review Letters, 115. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.031802 | Evidence of Wγγ production in pp collisions at √s=8 TeV and limits on anomalous Quartic Gauge Couplings with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
identificationandenergycalibrationof | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3500-z | Identification and energy calibration of hadronically decaying tau leptons with the ATLAS experiment in pp collisions at √s=8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthechargeasymmetryind | Journal of High Energy Physics, 2015. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2015)061 | Measurement of the charge asymmetry in dileptonic decays of top quark pairs in pp collisions at √s=7 TeV using the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthetoppairproductionc | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Manjarres, R.J.; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.112013 | Measurement of the top pair production cross section in 8 TeV proton-proton collisions using kinematic information in the lepton plus jets final state with ATLAS | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
measurementofthree-jetproductioncros | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3363-3 | Measurement of three-jet production cross-sections in pp collisions at 7 TeV centre-of-mass energy using the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementsofthetotalanddifferenti | Physical Review Letters, 115. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.091801 | Measurements of the Total and Differential Higgs Boson Production Cross Sections Combining the H→γγ and H→ZZ∗→4ℓ Decay Channels at √s=8 TeV with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
observationandmeasurementofhiggsbos | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92, 1 - 84. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.012006 | Observation and measurement of Higgs boson decays to WW* with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
observationandmeasurementsoftheprod | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3406-9 | Observation and measurements of the production of prompt and non-prompt JψJψ mesons in association with a Z boson in pp collisions at √s=8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
precisionmeasurementofthetop-quarkm | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.112003 | Precision measurement of the top-quark mass in lepton+ jets final states | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
searchforhiggsandzbosondecaystoj | Physical Review Letters, 114. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.121801 | Search for Higgs and Z Boson Decays to J/ψγ and Υ(nS)γ with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchfornewphenomenaindijetangula | Physical Review Letters, 114. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.221802 | Search for New Phenomena in Dijet Angular Distributions in Proton-Proton Collisions at √s = 8 TeV Measured with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforachargedhiggsbosonproduce | Physical Review Letters, 114. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.231801 | Search for a Charged Higgs Boson Produced in the Vector-Boson Fusion Mode with Decay H-+/- -> W(+/-)Z using pp Collisions at root √s=8 TeV with the ATLAS Experiment | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforaheavyneutralparticledeca | Physical Review Letters, 115. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.031801 | Search for a Heavy Neutral Particle Decaying to eμ, eτ, or μτ in pp Collisions at √s = 8 TeV with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforanewresonancedecayingtoa | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3474-x | Search for a new resonance decaying to a W or Z boson and a Higgs boson in the ℓℓ/ℓν/νν+bb final states with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
centralityandrapiditydependenceofin | Physics Letters B, 748, 392 - 413. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.07.023 | Centrality and rapidity dependence of inclusive jet production in √sNN=5.02 TeV proton–lead collisions with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfordirectpairproductionofac | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3408-7 | Search for direct pair production of a chargino and a neutralino decaying to the 125 GeV Higgs boson in √s=8 TeV pppp collisions with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforheavymajorananeutrinoswith | Journal of High Energy Physics, 2015. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2015)162 | Search for heavy Majorana neutrinos with the ATLAS detector in pp collisions at √s=8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
searchforhigh-massdiphotonresonances | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.032004 | Search for high-mass diphoton resonances in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforlong-lived,weaklyinteractin | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.012010 | Search for long-lived, weakly interacting particles that decay to displaced hadronic jets in proton-proton collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchformassivesupersymmetricpartic | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.112016 | Search for massive supersymmetric particles decaying to many jets using the ATLAS detector in pp collisions at √s=8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforproductionofww/wzresonance | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3425-6 | Search for production of WW/WZ resonances decaying to a lepton, neutrino and jets in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforsupersymmetryineventsconta | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3518-2 | Search for supersymmetry in events containing a same-flavour opposite-sign dilepton pair, jets, and large missing transverse momentum in √s=8 TeV pp collisions with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchfortype-iiiseesawheavyleptons | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.032001 | Search for type-III seesaw heavy leptons in pp collisions at √s=8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforvectorlikebquarksinevents | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.112011 | Search for vectorlike B quarks in events with one isolated lepton, missing transverse momentum, and jets at √s=8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
combinedmeasurementofthehiggsboson | Physical Review Letters, 114. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.191803 | Combined Measurement of the Higgs Boson Mass in pp Collisions at √s=7 and 8 TeV with the ATLAS and CMS Experiments | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
tevatronconstraintsonmodelsofthehi | Physical Review Letters, 114. ISSN 0031-9007. | Aaltonen, T.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.114.151802 | Tevatron Constraints on Models of the Higgs Boson with Exotic Spin and Parity Using Decays to Bottom-Antibottom Quark Pairs | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
determinationofspinandparityofthe | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3436-3 | Determination of spin and parity of the Higgs boson in the WW* -> eνμν decay channel with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
differentialtop-antitopcross-sectionm | Journal of High Energy Physics, 2015. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Bevan, A.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvatore, F.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2015)100 | Differential top-antitop cross-section measurements as a function of observables constructed from final-state particles using pp collisions at √s=7 TeV in the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchforheavyleptonresonancesdecay | Journal of High Energy Physics, September. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2015)108 | Search for heavy lepton resonances decaying to a Z boson and a lepton in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchfornewlightgaugebosonsinhig | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.092001 | Search for new light gauge bosons in Higgs boson decays to four-lepton final states in pp collisions at √s=8 TeV with the ATLAS detector at the LHC | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
studyof(w/z)hproductionandhiggsbos | Journal of High Energy Physics, August. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2015)137 | Study of (W/Z)H production and Higgs boson couplings using H -> WW* decays with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
asearchfortt¯resonancesusinglepton | Journal of High Energy Physics, August. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2015)148 | A search for tt¯ resonances using lepton-plus-jets events in proton-proton collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
summaryoftheatlasexperiment’ssensit | Journal of High Energy Physics, October. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2015)134 | Summary of the ATLAS experiment’s sensitivity to supersymmetry after LHC Run 1-interpreted in the phenomenological MSSM | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
zbosonproductioninp+pbcollisionsat | Physical Review C. Nuclear Physics, 92. ISSN 0556-2813. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; K+APY-nig, A.C.; Nektarijevic, S.; Salvucci, A.; Strubig, A.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.92.044915 | Z boson production in p+Pb collisions at √−−−sNN = 5.02 TeV measured with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
determinationofthetop-quarkpolemass | Journal of High Energy Physics, October. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Bevan, A.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2015)121 | Determination of the top-quark pole mass using tt¯+1-jet events collected with the ATLAS experiment in 7 TeV pp collisions | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchfors-channelsingletop-quarkpr | Physics Letters B, 740, 118 - 136. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2014.11.042 | Search for s-channel single top-quark production in proton–proton collisions at √s=8TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementoffour-jetdifferentialcro | Journal of High Energy Physics, December. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2015)105 | Measurement of four-jet differential cross sections in √s=8 TeV proton-proton collisions using the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
constraintsontheoff-shellhiggsboson | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3542-2 | Constraints on the off-shell Higgs boson signal strength in the high-mass ZZ and WW final states with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementoftheproductionofneighbo | Physics Letters B, 751, 376 - 395. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.10.059 | Measurement of the production of neighbouring jets in lead–lead collisions √sNN−−− = 2.76 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementsofthetopquarkbranching | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Czodrowski, P.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.072005 | Measurements of the top quark branching ratios into channels with leptons and quarks with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
modellingz→ττprocessesinatlaswithτ | Journal of Instrumentation, 10. ISSN 1748-0221. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/10/09/p09018 | Modelling Z→ττ processes in ATLAS with τ-embedded Z→μμ data | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchfordarkmatterineventswithmi | Physical Review Letters, 115. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.H.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.131801 | Search for Dark Matter in Events with Missing Transverse Momentum and a Higgs Boson Decaying to Two Photons in pp Collisions at √s- = 8 TeV with the ATLAS Detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforhiggsbosonsdecayingtoaai | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.052002 | Search for Higgs bosons decaying to aa in the μμττ final state in pp collisions at √s= 8 TeV with the ATLAS experiment | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforviolationofcptandlorentz | Physical Review Letters, 115, 1 - 8. ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.161601 | Search for Violation of CPT and Lorentz Invariance in B0s Meson Oscillations | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
searchforheavylong-livedmulti-charge | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3534-2 | Search for heavy long-lived multi-charged particles in pp collisions at √s = 8 TeV using the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
erratumto:measurementoftheinclusive | Journal of High Energy Physics, September. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2015)141 | Erratum to: Measurement of the inclusive jet cross-section in proton-proton collisions at root √s=7 TeV using 4.5 fb(-1) of data with the ATLAS detector (vol 2, 153, 2015) | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforinvisibledecaysofthehiggs | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3551-1 | Search for invisible decays of the Higgs boson produced in association with a hadronically decaying vector boson in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforlow-scalegravitysignatures | Journal of High Energy Physics, 2015. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2015)032 | Search for low-scale gravity signatures in multi-jet final states with the ATLAS detector at √s = 8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchformassive,long-livedparticles | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.072004 | Search for massive, long-lived particles using multitrack displaced vertices or displaced lepton pairs in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforproductionofvector-likequa | Journal of High Energy Physics, 2015. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2015)105 | Search for production of vector-like quark pairs and of four top quarks in the lepton-plus-jets final state in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfortheassociatedproductionof | Physics Letters B, 749, 519 - 541. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.07.079 | Search for the associated production of the Higgs boson with a top quark pair in multilepton final states with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
simultaneousmeasurementofforward-back | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.052007 | Simultaneous measurement of forward-backward asymmetry and top polarization in dilepton final states from tt¯ production at the Tevatron | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
erratumto:searchfornewphenomenain | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3639-7 | Erratum to: Search for new phenomena in final states with an energetic jet and large missing transverse momentum in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
tevatroncombinationofsingle-top-quark | Physical Review Letters, 115. ISSN 0031-9007. | Aaltonen, T.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.152003 | Tevatron Combination of Single-Top-Quark Cross Sections and Determination of the Magnitude of the Cabibbo-Kobayashi-Maskawa Matrix Element Vtb | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
erratumto:searchforproductionofww | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3593-4 | Erratum to: Search for production of WW / WZ resonances decaying to a lepton, neutrino and jets in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
erratumto:searchforsupersymmetryin | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strübig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3661-9 | Erratum to: Search for supersymmetry in events containing a same-flavour opposite-sign dilepton pair, jets, and large missing transverse momentum in √s=8 TeV pp collisions with the ATLAS detector (vol 75, 318, 2015) | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofcharged-particlespectra | Journal of High Energy Physics. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strübig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep09(2015)050 | Measurement of charged-particle spectra in Pb+Pb collisions at √−−−sNN=2.76 TeV with the ATLAS detector at the LHC | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofdifferentialj/ψproducti | Physical Review C. Nuclear Physics, 92. ISSN 0556-2813. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.92.034904 | Measurement of differential J/ψ production cross-sections and forward-backward ratio in p+Pb collisions with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofexclusiveγγ→ℓ+ℓ-produc | Physics Letters B, 749, 242 - 261. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.07.069 | Measurement of exclusive γγ →ℓ+ℓ- production in proton-proton collisions at √s = 7 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthecorrelationbetweenf | Physical Review C. Nuclear Physics, 92. ISSN 0556-2813. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.92.034903 | Measurement of the correlation between flow harmonics of different order in lead-lead collisions at √sNN−−−−=2.76 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
atlasrun1searchesfordirectpairpro | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3726-9 | ATLAS Run 1 searches for direct pair production of third-generation squarks at the Large Hadron Collider | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthett-wandtt-zproduct | Journal of High Energy Physics, November. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2015)172 | Measurement of the tt-W and tt-Z production cross sections in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
analysisofeventswithb-jetsandapai | Journal of High Energy Physics, 2015. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2015)150 | Analysis of events with b-jets and a pair of leptons of the same charge in pp collisions at √s=8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforhigh-massdibosonresonances | Journal of High Energy Physics. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep12(2015)055 | Search for high-mass diboson resonances with boson-tagged jets in proton-proton collisions at √s = TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforlepton-flavour-violatingh-> | Journal of High Energy Physics, November. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2015)211 | Search for lepton-flavour-violating H -> μτ decays of the Higgs boson with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforpairproductionofanewheav | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 92. ISSN 1550-7998. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strübig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.92.112007 | Search for pair production of a new heavy quark that decays into a W boson and a light quark in pp collisions at √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
studyofthespinandparityofthehigg | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Nektarijevic, S.; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3685-1 | Study of the spin and parity of the Higgs boson in diboson decays with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
two-particlebose-einsteincorrelations | European Physical Journal C, 75. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-015-3644-x | Two-particle Bose-Einstein correlations in pp collisions at √s=0.9 and 7 TeV measured with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
constraintsonnewphenomenaviahiggsb | Journal of High Energy Physics. ISSN 1126-6708. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; König, A.C; Nektarijevic, S.; Strubig, A.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2015)206 | Constraints on new phenomena via Higgs boson couplings and invisible decays with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
inclusiveproductionofthex(4140)stat | Physical Review Letters, 115. ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.115.232001 | Inclusive production of the X(4140) state in pp¯ collisions at D0 | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
jetenergymeasurementanditssystemati | European Physical Journal C, 75, 1 - 101. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.; König, A.C; Salvucci, A.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-3190-y | Jet energy measurement and its systematic uncertainty in proton–proton collisions at √s = 7 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthew+b-jetandw+c-jet | Physics Letters B, 743, 6 - 14. ISSN 0370-2693. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.02.012 | Measurement of the W +b-jet and W +c-jet differential production cross sections in p¯p collisions at √s = 1.96 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementoftheww+wzcrosssection | Journal of High Energy Physics, 2015, 1 - 42. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2015)049 | Measurement of the WW + WZ cross section and limits on anomalous triple gauge couplings using final states with one lepton, missing transverse momentum, and two jets with the ATLAS detector at √s = 7 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementoftheproductionandlepton | European Physical Journal C, 75, 1 - 30. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.; König, A.C; Salvucci, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-3231-6 | Measurement of the production and lepton charge asymmetry of W bosons in Pb+Pb collisions at √sNN = 2.76 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthetransversepolarizati | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.032004 | Measurement of the transverse polarization of Λ and Λ¯ hyperons produced in proton-proton collisions at root √s =7 TeV using the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsofhiggsbosonproductiona | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 91. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.91.012006 | Measurements of Higgs boson production and couplings in the four-lepton channel in pp collisions at center-of-mass energies of 7 and 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforh→γγproducedinassociation | Physics Letters B, 740, 222 - 242. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2014.11.049 | Search for H→γγ produced in association with top quarks and constraints on the Yukawa coupling between the top quark and the Higgs boson using data taken at 7 TeV and 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforw′→tb¯intheleptonplusjet | Physics Letters B, 743, 235 - 255. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.02.051 | Search for W′→tb¯ in the lepton plus jets final state in proton-proton collisions at a centre-of-mass energy of √s = 8 TeV with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforpair-producedlong-livedneut | Physics Letters B, 743, 15 - 34. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2015.02.015 | Search for pair-produced long-lived neutral particles decaying to jets in the ATLAS hadronic calorimeter in pp collisions at √s = 8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforthexbandotherhidden-beaut | Physics Letters B, 740, 199 - 217. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, a. | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2014.11.055 | Search for the Xb and other hidden-beauty states in the π+π−Υ(1S)channel at ATLAS | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforthebb¯decayofthestanda | Journal of High Energy Physics, 2015, 1 - 89. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2015)069 | Search for the b b ¯ decay of the Standard Model Higgs boson in associated (W/Z)H production with the ATLAS detector | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchesforheavylong-livedchargedpa | Journal of High Energy Physics, 2015, 1 - 51. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.F.; König, A.C; Salvucci, A.; Strubig, A.; Et, al | 2015 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2015)068 | Searches for heavy long-lived charged particles with the ATLAS detector in proton-proton collisions at √s = 8 TeV | 2015 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
observationofs-channelproductionofs | Physical Review Letters, 112, 231803. ISSN 0031-9007. | Aaltonen, T.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.112.231803 | Observation of s-Channel Production of Single Top Quarks at the Tevatron | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
precisionmeasurementofthetopquarkm | Physical Review Letters, 113, 032002. ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.113.032002 | Precision Measurement of the Top Quark Mass in Lepton + Jets Final States | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
searchfordirecttop-squarkpairproduc | Journal of High Energy Physics, 124(1) - 124(). ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2014)124 | Search for direct top-squark pair production in final states with two leptons in pp collisions at root s=8 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforsupersymmetryat√s=8tevin | Journal of High Energy Physics, 035(1) - 035(50). ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.A.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2014)035 | Search for supersymmetry at √s = 8TeV in final states with jets and two same-sign leptons or three leptons with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfortopquarkdecayst→qhwithh→ | Journal of High Energy Physics, 008(1) - 008(40). ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.; König, A.C; Raas, M.; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2014)008 | Search for top quark decays t→qH with H→γγ using the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofdijetcross-sectionsinp | Journal of High Energy Physics, May, 059(1) - 059(67). ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep05(2014)059 | Measurement of dijet cross-sections in pp collisions at 7 TeV centre-of-mass energy using the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofevent-planecorrelations | Physical Review C. Nuclear Physics, 90, 024905. ISSN 0556-2813. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.90.024905 | Measurement of event-plane correlations in √sNN = 2.76 TeV lead-lead collisions with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementoftheparity-violatingasym | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 89, 092009. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.89.092009 | Measurement of the parity-violating asymmetry parameter ab and the helicity amplitudes for the decay Lambda(0)(b) -> J/psi Lambda(0) with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofχc1andχc2production | Journal of High Energy Physics, 2014, 154(1) - 154(52). ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2014)154 | Measurement of χ c1 and χ c2 production with s = 7 TeV pp collisions at ATLAS | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
measurementsoffour-leptonproductiona | Physical Review Letters, 112, 231806(1) - 231806(18). ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.112.231806 | Measurements of Four-Lepton Production at the Z Resonance in pp Collisions at √s=7 and 8 TeV with ATLAS | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
thedifferentialproductioncrosssectio | European Physical Journal C, 74, 2895. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Chelstowska, M.A.; Groot, N. de; Filthaut, F.; Klok, P.; König, A.C; Koetsveld, F.; Raas, M.; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-2895-2 | The differential production cross section of the ϕ (1020) meson in √s = 7 TeV pp collisions measured with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthemassdifferencebetwe | Physics Letters B, 728, 363 - 379. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Klok, P.F.; König, A.C; Salvucci, A. | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2013.12.010 | Measurement of the mass difference between top and anti-top quarks in pp collisions at using the atlas detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
measurementofthedirectcp-violatingc | Physical Review Letters, 112, 111804(1) - 111804(8). ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.112.111804 | Measurement of the Direct CP-violating Charge Asymmetry in D±s→ϕπ± Decays | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementofthewbosonproductionch | Physical Review Letters, 112, 151803(1) - 151803(7). ISSN 0031-9007. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.112.151803 | Measurement of the W Boson Production Charge Asymmetry in pp¯→W+X→eν+X Events at s√=1.96 TeV | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementofthewbosonmasswiththe | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 89, 012005(1) - 012005(43). ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.; Zivkovic, L.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.89.012005 | Measurement of the W boson mass with the D0 detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 6 | (1.1) one exact match |
measurementoftheelectroweakproductio | Journal of High Energy Physics, 2014, 1 - 56. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2014)031 | Measurement of the electroweak production of dijets in association with a Z-boson and distributions sensitive to vector boson fusion in proton-proton collisions at √s = 8 TeV using the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofthetopquarkpairproduc | Journal of High Energy Physics, February, 107(1) - 107(38). ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep02(2014)107 | Measurement of the top quark pair production charge asymmetry in proton-proton collisions at root s=7 TeV using the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
searchforhiggsbosondecaystoaphoto | Physics Letters B, 732, 8 - 27. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.; König, A.C; Salvucci, A.; Zurzola, G.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2014.03.015 | Search for Higgs boson decays to a photon and a Z boson in pp collisions at √s=7 and 8 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforquantumblackholeproduction | Physical Review Letters, 112, 091804(1) - 091804(18). ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; al., E. | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.112.091804 | Search for Quantum Black Hole Production in High-Invariant-Mass Lepton+Jet Final States Using pp Collisions at √s=8 TeV and the ATLAS Detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforamulti-higgs-bosoncascadei | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 89, 032002(1) - 032002. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.89.032002 | Search for a multi-Higgs-boson cascade in W(+)W(-)b(b)over-bar events with the ATLAS detector in pp collisions at root s=8 TeV | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
searchfordirectproductionofchargino | Journal of High Energy Physics, 2014. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; al., E. | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep04(2014)169 | Search for direct production of charginos and neutralinos in events with three leptons and missing transverse momentum in √s = 8 TeV pp collisions with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
searchforthex(4140)stateinb+→j/ψϕk | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 89, 012004(1) - 012004(9). ISSN 1550-7998. | Abazov, V.M.; Jong, S. De; Filthaut, F.; Meijer, M.M.; Zivkovic, L.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.89.012004 | Search for the X(4140) state in B+→J/ψϕK+ decays with the D0 detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 6 | (1.1) one exact match |
standalonevertexfindingintheatlasm | Journal of Instrumentation, 9, P02001(1) - P02001(40). ISSN 1748-0221. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/9/02/p02001 | Standalone vertex finding in the ATLAS muon spectrometer | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
studyofheavy-flavorquarksproducedin | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 89, 072012(1) - 072012(23). ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Chelstowska, M.A.; Dao, V.; Groot, N. de; Filthaut, F.; Klok, P.; König, A.C; Raas, M.; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.89.072012 | Study of heavy-flavor quarks produced in association with top-quark pairs at root s=7 TeV using the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
combinationofmeasurementsofthetop-q | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 89, 072001(1) - 072001(17). ISSN 1550-7998. | Aaltonen, T.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.89.072001 | Combination of measurements of the top-quark pair production cross section from the Tevatron Collider | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
doublepartoninteractionsingamma+3je | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 89, 072006(1) - 072006(15). ISSN 1550-7998. | Abazov, V.M.; Jong, S.J. de; Filthaut, F.; Meijer, M.M. | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.89.072006 | Double parton interactions in gamma+3 jet and gamma plus b/c jet+2 jet events in p(p)over-bar collisions at root s=1.96 TeV | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 4 | (1.1) one exact match |
electronandphotonidentificationinth | Nuclear Instruments and Methods in Physics Research, Section A: Accelerators, Spectrometers, Detectors and Associated Equipment, 750, 78 - 95. ISSN 0168-9002. | Abazov, V.M.; Jong, S. De; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nima.2014.03.013 | Electron and Photon Identification in the D0 Experiment | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
corrigendumto“measurementsofhiggsbo | Physics Letters B, 734, 406 - 406. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; Konig, A.C.; Salvucci, A.; Et, a. | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2014.05.011 | Corrigendum to “Measurements of Higgs boson production and couplings in diboson final states with the ATLAS detector at the LHC” [Phys. Lett. B 726 (1–3) (2013) 88] | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
erratum:searchfornewphenomenainfin | Journal of High Energy Physics, 2014, 1 - 18. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Dao, V.; Groot, N. de; Filthaut, F.; Klok, P.; König, A.C; Raas, M.; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2014)109 | Erratum: Search for new phenomena in final states with large jet multiplicities and missing transverse momentum at √s=8 TeV proton-proton collisions using the ATLAS experiment | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofhiggsbosonproductionin | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 90. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; Konig, A.C.; Salvucci, A.; Strubig, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.90.112015 | Measurement of Higgs boson production in the diphoton decay channel in pp collisions at center-of-mass energies of 7 and 8 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofdifferentialproductionc | Journal of High Energy Physics. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2014)141 | Measurement of differential production cross-sections for a Z boson in association with b-jets in 7 TeV proton-proton collisions with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofdifferentialttproductio | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 90. ISSN 1550-7998. | Abazov, V.M.; Jong, S. De; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.90.092006 | Measurement of differential tt production cross sections in pp collisions | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementofflowharmonicswithmulti | European Physical Journal C, 74, 1 - 28. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-3157-z | Measurement of flow harmonics with multi-particle cumulants in Pb+Pb collisions at √sNN = 2.76 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofinclusivejetcharged-par | Physics Letters B, 739, 320 - 342. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; Konig, A.C.; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2014.10.065 | Measurement of inclusive jet charged-particle fragmentation functions in Pb+Pb collisions at at √sNN = 2:76 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthecrosssectionofhigh | Physics Letters B, 738, 25 - 43. ISSN 0370-2693. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2014.09.020 | Measurement of the cross section of high transverse momentum Z -> b(b)over-bar production in proton-proton collisions at √s=8 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementofthedirectcp-violatingp | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 90. ISSN 1550-7998. | Abazov, V.M.; Jong, S. De; Filthaut, F.; Meijer, M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.90.111102 | Measurement of the direct CP-violating parameter ACP in the decay Dþ → K−πþπþ | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
measurementofthemuonreconstructionp | European Physical Journal C, 74, 1 - 34. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; Struebig, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-3130-x | Measurement of the muon reconstruction performance of the ATLAS detector using 2011 and 2012 LHC proton–proton collision data | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
measurementsofspincorrelationintop- | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 90. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.90.112016 | Measurements of spin correlation in top-antitop quark events from proton-proton collisions at √s=7 TeV using the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
observationandstudiesofdoublej/psi | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 90. ISSN 1550-7998. | Abazov, V.M.; Jong, S. De; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.90.111101 | Observation and studies of double J/psi production at the Tevatron | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
observationofanexcitedb±cmesonstat | Physical Review Letters, 113. ISSN 0031-9007. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.113.212004 | Observation of an Excited B±c Meson State with the ATLAS Detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforcontactinteractionsandlarg | European Physical Journal C, 74, 1 - 25. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-3134-6 | Search for contact interactions and large extra dimensions in the dilepton channel using proton–proton collisions at √s = 8 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
ameasurementoftheratiooftheproduc | European Physical Journal C, 74, 1 - 31. ISSN 1434-6044. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-014-3168-9 | A measurement of the ratio of the production cross sections for W and Z bosons in association with jets with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforneutralhiggsbosonsofthem | Journal of High Energy Physics, 2014, 1 - 47. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2014)056 | Search for neutral Higgs bosons of the minimal supersymmetric standard model in pp collisions at √s = 8 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfornonpointinganddelayedphoto | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 90. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; Strubig, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.90.112005 | Search for nonpointing and delayed photons in the diphoton and missing transverse momentum final state in 8 TeV pp collisions at the LHC using the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchforstrongproductionofsupersym | Journal of High Energy Physics, 2014. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, B.; Croft, V.; Dao, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep10(2014)024 | Search for strong production of supersymmetric particles in final states with missing transverse momentum and at least three b-jets at root s=8 TeV proton-proton collisions with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
searchfortopsquarkpairproductionin | Journal of High Energy Physics, 2014, 1 - 87. ISSN 1126-6708. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; König, A.C; Salvucci, A.; Struebig, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2014)118 | Search for top squark pair production in final states with one isolated lepton, jets, and missing transverse momentum in √s=8 TeV pp collisions with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
comprehensivemeasurementsoft-channel | Physical Review. D, Particles, Fields, Gravitation, and Cosmology, 90. ISSN 1550-7998. | Aad, G.; Besjes, G.J.; Caron, S.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.F.; Klok, P.; Konig, A.C.; Salvucci, A.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.90.112006 | Comprehensive measurements of t-channel single top-quark production cross sections at √s=7 TeV with the ATLAS detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
measurementofassociatedproductionof | Physical Review Letters, 112, 042001(1) - 042001(7). ISSN 0031-9007. | Abazov, V.M.; Jong, S. De; Filthaut, F.; Meijer, M.M.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.112.042001 | Measurement of Associated Production of Z Bosons with Charm Quark Jets in p(p)over-bar Collisions at root s = 1.96 TeV | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 5 | (1.1) one exact match |
muonreconstructionandidentificationw | Nuclear Instruments and Methods in Physics Research, Section A: Accelerators, Spectrometers, Detectors and Associated Equipment, 737, 281 - 294. ISSN 0168-9002. | Abazov, V.M.; Jong, S. De; Filthaut, F.; Meijer, M.M.; Zivkovic, L.; et al., | 2014 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.nima.2013.11.050 | Muon reconstruction and identification with the Run II D0 detector | 2014 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 6 | (1.1) one exact match |
volumeivthedunefardetectorsingle-p | Journal of Instrumentation, 15, 1 - 599. ISSN 1748-0221. | Abi, B.; Acciarri, R.; Acero, M.A.; Adamov, G.; Adams, D.; Adinolfi, M.; Filthaut, F.; Miedema, T.; Zutshi, V.; Zwaska, R. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/08/t08010 | Volume IV The DUNE far detector single-phase technology | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
volumeiiidunefardetectortechnicalc | Journal of Instrumentation, 15, 1 - 184. ISSN 1748-0221. | Abi, B.; Acciarri, R.; Acero, M.A.; Adamov, G.; Adams, D.; Adinolfi, M.; Filthaut, F.; Miedema, T.; Zutshi, V.; Zwaska, R. | 2020 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/15/08/t08009 | Volume III DUNE far detector technical coordination | 2020 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
measurementoflight-by-lightscattering | Journal of High Energy Physics, 2021(11):243. Springer Verlag. ISSN 1029-8479. | NA | 2021-3 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2021)243 | Measurement of light-by-light scattering and search for axion-like particles with 2.2 nb–1 of Pb+Pb data with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | NA | NA | (-1) no name |
measurementoftheassociatedproduction | Physics Letters B, 816:136204. Elsevier. ISSN 0370-2693. | NA | 2021-05-10 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2021.136204 | Measurement of the associated production of a Higgs boson decaying into b-quarks with a vector boson at high transverse momentum in pp collisions at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | NA | NA | (-1) no name |
performanceoftheatlasrpcdetectoran | Journal of Instrumentation, 16, 1 - 64. ISSN 1748-0221. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/16/07/p07029 | Performance of the ATLAS RPC detector and Level-1 muon barrel trigger at √s = 13 TeV | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
measurementsoftheinclusiveanddiffer | European Physical Journal C, 81, 1 - 43. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09439-4 | Measurements of the inclusive and differential production cross sections of a top-quark-antiquark pair in association with a Z boson at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementoftherelativeb±c/b±produ | Physical Review D, 104, 1 - 26. ISSN 2470-0010. | Aaboud, M.; Aad, G.; Abbott, B.; Abbott, D.C.; Abdinov, O.; Abed Abud, A.; Aggarwal, A.; Caron, S.; Colasurdo, L.; Groot, N. de; Fabiani, V.; Filthaut, F.; Igonkina, O.; Ilic, N.; König, A.C; Nektarijevic, S.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.104.012010 | Measurement of the relative B±c/B± production cross section with the ATLAS detector at √s = 8 TeV | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
searchingforsolarkdarwithdune | Journal of Cosmology and Astroparticle Physics, 2021, 1 - 26. ISSN 1475-7516. | Abud, A. Abed; Abi, B.; Acciarri, R.; Filthaut, F.; Miedema, T.; Zutshi, V.; Zwaska, R. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1475-7516/2021/10/065 | Searching for solar KDAR with DUNE | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 7 | (1.1) one exact match |
odderonexchangefromelasticscattering | Physical Review Letters, 127, 1 - 10. ISSN 0031-9007. | Abazov, V.M.; Abbott, B.; Acharya, B.S.; Adams, M.; Adams, T.; Agnew, J.P.; Jong, S.J. de; Filthaut, F.; Meijer, M.M.; Zieminska, D.; Zivkovic, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.127.062003 | Odderon Exchange from Elastic Scattering Differences between pp and p(p)over-bar Data at 1.96 TeV and from pp Forward Scattering Measurements | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 11 | (1.1) one exact match |
determinationofthepartondistribution | Journal of High Energy Physics, 2021, 1 - 44. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2021)223 | Determination of the parton distribution functions of the proton from ATLAS measurements of differential W± and Z boson production in association with jets | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
measurementsofdifferentialcross-secti | Journal of High Energy Physics, 2021, 1 - 67. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2021)005 | Measurements of differential cross-sections in four-lepton events in 13 TeV proton-proton collisions with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
exclusivedimuonproductioninultraperi | Physical Review C, 104, 1 - 32. ISSN 2469-9985. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.104.024906 | Exclusive dimuon production in ultraperipheral Pb plus Pb collisions at root √SNN = 5.02 TeV with ATLAS | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
observationofphoton-inducedw+w-prod | Physics Letters B, 816, 1 - 24. ISSN 0370-2693. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Pedraza Diaz, L.; Nellist, C.J.M.; Schouwenberg, J.F.P.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2021.136190 | Observation of photon-induced W+ W- production in pp collisions at √s = 13 TeV using the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 18 | (1.1) one exact match |
searchforhiggsbosonproductioninass | Journal of High Energy Physics, 2021, 1 - 37. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2021)268 | Search for Higgs boson production in association with a high-energy photon via vector-boson fusion with decay into bottom quark pairs at root s=13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
searchforpairproductionofthird-gene | Journal of High Energy Physics, 2021, 1 - 62. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2021)179 | Search for pair production of third-generation scalar leptoquarks decaying into a top quark and a τ-lepton in pp collisions at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
measurementsofhiggsbosonsdecayingto | European Physical Journal C, 81, 1 - 32. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09192-8 | Measurements of Higgs bosons decaying to bottom quarks from vvector boson fusion production with the ATLAS experiment at √s = 13 TeV | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforcharged-lepton-flavourviolat | Nature Physics, 17, 819 - +. ISSN 1745-2473. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1038/s41567-021-01225-z | Search for charged-lepton-flavour violation in Z-boson decays with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
searchforresonancesdecayingintophot | Physics Letters B, 822, 1 - 19. ISSN 0370-2693. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2021.136651 | Search for resonances decaying into photon pairs in 139 fb(-1) of pp collisions at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
two-particleazimuthalcorrelationsinp | Physical Review C, 104, 1 - 31. ISSN 2469-9985. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.104.014903 | Two-particle azimuthal correlations in photonuclear ultraperipheral Pb+Pb collisions at 5.02 TeV with ATLAS | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
searchfordisplacedleptonsin√s=13 | Physical Review Letters, 127, 1 - 21. ISSN 0031-9007. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.127.051802 | Search for Displaced Leptons in √s = 13 TeV pp Collisions with the ATLAS Detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
optimisationoflarge-radiusjetreconst | European Physical Journal C, 81, 1 - 47. ISSN 1434-6044. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Moskvitina, P.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09054-3 | Optimisation of large-radius jet reconstruction for the ATLAS detector in 13 TeV proton-proton collisions | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforpairproductionofscalarlep | European Physical Journal C, 81, 1 - 130. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Cui, H.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; König, A.C; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09009-8 | Search for pair production of scalar leptoquarks decaying into first- or second-generation leptons and top quarks in proton-proton collisions at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 20 | (1.1) one exact match |
muonreconstructionandidentificatione | European Physical Journal C, 81, 1 - 44. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09233-2 | Muon reconstruction and identification efficiency in ATLAS using the full Run 2 pp collision data set at √s = 13 TeV | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
jetenergyscaleandresolutionmeasured | The European Physical Journal C: Particles and Fields, 81, 1 - 49. ISSN 1434-6052. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09402-3 | Jet energy scale and resolution measured in proton–proton collisions at √s =13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
asearchforthedecaysofstoppedlong- | Journal of High Energy Physics, 2021, 1 - 49. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep07(2021)173 | A search for the decays of stopped long-lived particles at √s = 13 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
searchfordoublyandsinglychargedhig | Journal of High Energy Physics, 2021, 1 - 54. ISSN 1029-8479. | Aaboud, M.; Aad, G.; Abbott, B.; Abdinov, O.; Abeloos, B.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Nellist, C.J.M.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2021)146 | Search for doubly and singly charged Higgs bosons decaying into vector bosons in multi-lepton final states with the ATLAS detector using proton-proton collisions at √s = 13 TeV | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
testoftheuniversalityoftauandmul | Nature Physics, 17, 813 - 818. ISSN 1745-2473. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.0.1038/s41567-021-01236-w | Test of the universality of tau and mu lepton couplings in W-boson decays with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
measurementofsingletop-quarkproducti | European Physical Journal C, 81, 1 - 29. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.; Ilic, N.; König, A.C; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, R.; Zwalinski, L. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09371-7 | Measurement of single top-quark production in association with a W boson in the single-lepton channel at √s = 8 TeV with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 19 | (1.1) one exact match |
erratumto:measurementoflight-by-ligh | Journal of High Energy Physics, 2021, 1 - 19. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Igonkina, O.B.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2021 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2021)050 | Erratum to: Measurement of light-by-light scattering and search for axion-like particles with 2.2 nb−1 of Pb+Pb data with the ATLAS detector | 2021 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
asearchforanunexpectedasymmetryin | Physics Letters B, 830:137106. Elsevier. ISSN 0370-2693. | NA | 2022-7 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2022.137106 | A search for an unexpected asymmetry in the production of e+μ– and e–μ+ pairs in proton-proton collisions recorded by the ATLAS detector at √s = 13 TeV | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | NA | NA | (-1) no name |
atlfast3:thenextgenerationoffastsi | Computing and Software for Big Science, 6(1):7. ISSN 2510-2036. | NA | 2022-12 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/s41781-021-00079-7 | AtlFast3: the next generation of fast simulation in ATLAS | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | NA | NA | (-1) no name |
constraintsonhiggsbosonproductionwi | Physical Review D, 105(9):092003. American Institute of Physics. ISSN 2470-0010. | NA | 2022-05-01 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.105.092003 | Constraints on Higgs boson production with large transverse momentum using H→ bb̅ decays in the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | NA | NA | (-1) no name |
theatlasinnerdetectortriggerperform | European Physical Journal C, 82, 1 - 57. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Schouwenberg, J.F.P.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09920-0 | The ATLAS inner detector trigger performance in pp collisions at 13 TeV during LHC Run 2 | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 17 | (1.1) one exact match |
searchforneutrallong-livedparticles | Journal of High Energy Physics, 2022, 1 - 49. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Perrevoort, A.K.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2022)005 | Search for neutral long-lived particles in pp collisions at √s = 13 TeV that decay into displaced hadronic jets in the ATLAS calorimeter | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
searchforresonantpairproductionofh | Physical Review D, 105, 1 - 36. ISSN 2470-0010. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.105.092002 | Search for resonant pair production of Higgs bosons in the b¯bb¯b final state using pp collisions at √s = 13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
searchfornewphenomenainthree-orfo | Physics Letters B, 824, 1 - 24. ISSN 0370-2693. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2021.136832 | Search for new phenomena in three- or four-lepton events in pp collisions at √s = 13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
searchforflavour-changingneutral-curr | European Physical Journal C, 82, 1 - 35. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Pedraza Diaz, L.; Nellist, C.J.M.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-022-10182-7 | Search for flavour-changing neutral-current interactions of a top quark and a gluon in pp collisions at √s = 13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
searchforinvisiblehiggs-bosondecays | Journal of High Energy Physics, 1 - 63. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Perrevoort, A.K.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2022)104 | Search for invisible Higgs-boson decays in events with vector-boson fusion signatures using 139 fb(-1) of proton-proton data recorded by the ATLAS experiment | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
modellingandcomputationalimprovements | Journal of High Energy Physics, 2022, 1 - 61. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Perrevoort, A.K.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2022)089 | Modelling and computational improvements to the simulation of single vector-boson plus jet processes for the ATLAS experiment | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
emulatingtheimpactofadditionalproto | Computing and Software for Big Science, 6, 1 - 35. ISSN 2510-2036. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/s41781-021-00062-2 | Emulating the impact of additional proton–proton interactions in the ATLAS simulation by presampling sets of inelastic Monte Carlo events | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
design,constructionandoperationofth | Journal of Instrumentation, 17, 1 - 111. ISSN 1748-0221. | Abed Abud, A.; Abi, B.; Acciarri, R.; Filthaut, F.; Miedema, T.; Zuklin, J.; Zutshi, V.; Zwaska, R. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/17/01/p01005 | Design, construction and operation of the ProtoDUNE-SP Liquid Argon TPC | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 8 | (1.1) one exact match |
operationandperformanceoftheatlass | Journal of Instrumentation, 17, 1 - 56. ISSN 1748-0221. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1088/1748-0221/17/01/p01013 | Operation and performance of the ATLAS semiconductor tracker in LHC Run 2 | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
searchforheavyparticlesintheb-tagg | Physical Review D, 105, 1 - 22. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.105.012001 | Search for heavy particles in the b-tagged dijet mass distribution with additional b-tagged jets in proton-proton collisions at √s = 13 TeV with the ATLAS experiment | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
measurementofhiggsbosondecayintob- | Journal of High Energy Physics, 2022, 1 - 63. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Pedraza Diaz, L.; Nellist, C.J.M.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep06(2022)097 | Measurement of Higgs boson decay into b-quarks in associated production with a top-quark pair in pp collisions at √s = 13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
directconstraintonthehiggs-charmcou | European Physical Journal C, 82, 1 - 42. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Alderweireldt, S.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Perrevoort, A.K.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-022-10588-3 | Direct constraint on the Higgs-charm coupling from a search for Higgs boson decays into charm quarks with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
measurementoftheenergyasymmetryin | European Physical Journal C, 82, 1 - 36. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Pedraza Diaz, L.; Nellist, C.J.M.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-022-10101-w | Measurement of the energy asymmetry in tt¯j production at 13 TeV with the ATLAS experiment and interpretation in the SMEFT framework | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
searchforeventswithapairofdisplac | Physical Review D, 106, 1 - 28. ISSN 2470-0010. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.106.032005 | Search for events with a pair of displaced vertices from long-lived neutral particles decaying into hadronic jets in the ATLAS muon spectrometer in sions at √s = 13TeV | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
lowexposurelong-baselineneutrinoosci | Physical Review D, 105, 1 - 32. ISSN 2470-0010. | Abed Abud, A.; Abi, B.; Acciarri, R.; Acero, M.A.; Adames, M.R.; Adamov, G.; Filthaut, F.; Miedema, T.; Roy, P.; Xie, F.; Zutshi, V.; Zwaska, R. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.105.072006 | Low exposure long-baseline neutrino oscillation sensitivity of the DUNE experiment | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 12 | (1.1) one exact match |
separationoftrack-andshower-likeene | The European Physical Journal C: Particles and Fields, 82, 1 - 19. ISSN 1434-6052. | Abed Abud, A.; Abi, B.; Acciarri, R.; Filthaut, F.; Miedema, T.; Zucchelli, S.; Zuklin, J.; Zutshi, V.; Zwaska, R. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-022-10791-2 | Separation of track- and shower-like energy deposits in ProtoDUNE-SP using a convolutional neural network | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
searchforhiggsbosonsdecayingintone | Journal of High Energy Physics, 1 - 64. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep03(2022)041 | Search for Higgs bosons decaying into new spin-0 or spin-1 particles in four-lepton final states with the ATLAS detector with 139 fb(-1) of pp collision data at √s = 13 TeV | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
measurementofthepolarisationofsingl | Journal of High Energy Physics, 2022, 1 - 62. ISSN 1029-8479. | Aad, G.; Aggarwal, A.; Caron, S.; Fabiani, V.; Filthaut, F.; Groot, N. de; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep11(2022)040 | Measurement of the polarisation of single top quarks and antiquarks produced in the t-channel at √s = 13 TeV and bounds on the tWb dipole operator from the ATLAS experiment | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
measurementsofjetobservablessensitiv | Physical Review D, 106, 1 - 33. ISSN 2470-0010. | Aad, G.; Abbott, B.; Abbott, D.C.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Ilic, N.; Konig, A.C.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.106.032008 | Measurements of jet observables sensitive to b-quark fragmentation in t¯t events at the LHC with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
searchforassociatedproductionofaz | Physics Letters B, 829, 1 - 25. ISSN 0370-2693. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1016/j.physletb.2022.137066 | Search for associated production of a Z boson with an invisibly decaying Higgs boson or dark matter candidates at √s = 13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
performanceoftheatlaslevel-1topolog | European Physical Journal C, 82, 1 - 26. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09807-0 | Performance of the ATLAS Level-1 topological trigger in Run 2 | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
measurementsofhiggsbosonproductionc | Journal of High Energy Physics, 1 - 81. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Pedraza Diaz, L.; Nellist, C.J.M.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2022)175 | Measurements of Higgs boson production cross-sectionsin the H → τ+τ− decay channel in pp collisions at √s = 13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
constraintsonhiggsbosonpropertiesus | European Physical Journal C, 82, 1 - 33. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L.; Schouwenberg, J.F.P. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-022-10366-1 | Constraints on Higgs boson properties using WW*(→ eνμν) j j production in 36.1 fb(-1) of √s =13 TeV pp collisions with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 13 | (1.1) one exact match |
studyofb-c(+)->j/psid-s(+)andb-c( | Journal of High Energy Physics, 2022, 1 - 42. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Pedraza Diaz, L.; Nellist, C.J.M.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep08(2022)087 | Study of B-c(+) -> J/psi D-s(+) and B-c(+)-> J/psi D-s*(+)decays in pp collisions at √s = 13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
scintillationlightdetectioninthe6-m | European Physical Journal C, 82, 1 - 29. ISSN 1434-6044. | Abed Abud, A.; Abi, B.; Acciarri, R.; Acero, M.A.; Adames, M.R.; Adamov, G.; Filthaut, F.; Miedema, T.; Zutshi, V.; Zwaska, R. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-022-10549-w | Scintillation light detection in the 6-m drift-length ProtoDUNE Dual Phase liquid argon TPC | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
measurementoftheenergyresponseofth | European Physical Journal C, 82, 1 - 31. ISSN 1434-6044. | Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Abidi, S.H.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-022-10117-2 | Measurement of the energy response of the ATLAS calorimeter to charged pions from W±→τ±(→π±ντ)ντ events in Run 2 data | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
searchforexoticdecaysofthehiggsbo | Journal of High Energy Physics, 1 - 38. ISSN 1029-8479. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Fabiani, V.; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1007/jhep01(2022)063 | Search for exotic decays of the Higgs boson into b(b)over-bar and missing transverse momentum in pp collisions at root s=13 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 16 | (1.1) one exact match |
measurementofthec-jetmistaggingeffi | European Physical Journal C, 82, 1 - 27. ISSN 1434-6044. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Pedraza Diaz, L.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09843-w | Measurement of the c-jet mistagging efficiency in t(t)over-bar events using pp collision data at √s = 13 TeV collected with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 15 | (1.1) one exact match |
measurementsofazimuthalanisotropieso | Physical Review C, 105, 1 - 25. ISSN 2469-9985. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Perrevoort, A.K. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevc.105.064903 | Measurements of azimuthal anisotropies of jet production in Pb+Pb collisions at √sNN=5.02 TeV with the ATLAS detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
observationofwwwproductioninppcoll | Physical Review Letters, 129, 1 - 20. ISSN 0031-9007. | Aad, G.; Abbott, B.; Abbott, D.C.; Abed Abud, A.; Abeling, K.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.J.M.; Perrevoort, A.K.; Zou, W.; Zwalinski, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevlett.129.061803 | Observation of WWW Production in pp Collisions at √s = 13 TeV with the ATLAS Detector | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 14 | (1.1) one exact match |
searchforhiggsbosondecaysintoapai | Physical Review D, 105, 1 - 29. ISSN 2470-0010. | Aad, G.; Aggarwal, A.; Caron, S.; Groot, N. de; Filthaut, F.; Gottardo, C.A.; Moskvitina, P.; Nellist, C.; Pedraza Diaz, L. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1103/physrevd.105.012006 | Search for Higgs boson decays into a pair of pseudoscalar particles in the bbμμ final state with the ATLAS detector in pp collisions at √s = 13 TeV | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 9 | (1.1) one exact match |
erratumto:searchforsingletop-quark | European Physical Journal C, 82, 1 - 19. ISSN 1434-6044. | Aad, G.; Caron, S.; Colasurdo, L.; Croft, V.; Groot, N. de; Filthaut, F.; Galea, C.; Konig, A.C.; Nektarijevic, S.; Strubig, A. | 2022 | Artikel | /person/RecordID/PRS1307612/Language/nl | 10.1140/epjc/s10052-021-09929-5 | Erratum to: Search for single top-quark production via flavour-changing neutral currents at 8 TeV with the ATLAS detector (vol 76, 55, 2016) | 2022 | i8a16306b35 | PRS1307612 | 1 | 0 | Filthaut, F. | frank | F. | filthaut | men | men | dutch | majority | majority | missing | RU | 1993 | NA | NA | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/publication/RecordID/oai%3Arepository.ubn.ru.nl%3A2066%2F145707/genre/doctoralthesis/meta_repositorygroupid/ru/dd_year/1993/id/65/Language/NL | https://www.narcis.nl/person/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/personpub/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/RecordID/PRS1307612/Language/nl/ | https://www.narcis.nl/person/RecordID/PRS1307612/ | 0 | FALSE | 2014 | 2022 | 283 | 1 | 10 | (1.1) one exact match |
Googling and looking at pubs, this seems to be legit. Is listed as author on many publications in relation to the atlas experiment at the CERN larger hadron collider. ;-)
ggplot(df_ppf_sel, aes(npubs, fill = gender2)) + geom_histogram(binwidth = 1) + facet_grid(gender2 ~
., margins = TRUE, scales = "free") + labs(fill = "gender")
Nice, but this one for the paper
df_ppf_sel$npubs2 <- ifelse(df_ppf_sel$npubs > 40, 40, df_ppf_sel$npubs)
Figure3 <- ggplot(df_ppf_sel, aes(npubs2)) + geom_histogram(binwidth = 0.5, closed = "left") + labs(x = "publications per year",
caption = "Note: maximum set to 30 for visualization purposes") + scale_x_continuous(limits = c(-1,
30)) + theme_minimal() + theme(legend.position = "none") + theme(plot.caption = element_text(hjust = 0)) +
theme(plot.background = element_rect(colour = "black", fill = NA, size = 1))
# fsave(Figure3, 'Figure3')
Figure3
An anonymous reviewer did request a split by gender.
We prefer this strategy.
df_ppf_sel$npubs2 <- ifelse(df_ppf_sel$npubs > 40, 40, df_ppf_sel$npubs)
df_sample <- df_ppf_sel %>%
group_by(gender2) %>%
sample_n(40000)
# ggplot(df_ppf_sel, aes(npubs2, colour = gender)) + geom_histogram()
Figure3_rev <- ggplot(df_sample, aes(npubs2, fill = gender2)) + geom_histogram(binwidth = 0.5, closed = "left") +
labs(x = "publications per year", caption = "Notes: \nMaximum is set to 30 for visualization purposes. \nTo be able to compare men and women, we randomly selected 40,000 person-years for each gender.") +
scale_x_continuous(limits = c(-1, 30)) + theme_minimal() + theme(plot.caption = element_text(hjust = 0)) +
labs(fill = "gender")
# theme(plot.background = element_rect(colour=gender2, fill=NA, size=1))
# fsave(Figure3_rev, 'Figure3_rev')
Figure3_rev
Figure 3. Histogram of yearly number of publications per author
df3 <- df_ppf[, c("npubs", "npubs_a", "npubs_first_a", "npubs_mid_a", "npubs_last_a", "time", "id", "covid",
"covid2020", "covid2021", "gender2", "phd_year0", "c2005", "c2010", "ethnicity", "uni", "life_domain",
"physical_domain", "social_domain")]
df3 <- na.omit(df3)
knots5 <- quantile(df3$time, probs = seq(0, 1, 0.25))[2:4]
con <- gamlss.control(n.cyc = 150)
# sum(df3$life_domain==1) sum(df3$life_domain>.5) thus depends (duh) how to filter on domain, see
# robustness checks later
m1_bnb <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + covid, data = df3, family = BNB, control = con)
coef(m1_bnb)
# fsave(m1_bnb, 'm1_bnb')
sm1_bnb <- summary(m1_bnb)
# fsave(sm1_bnb, 'sm1_bnb')
m1_NB <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + covid, data = df3, family = NBI, control = con)
AIC(m1_bnb, m1_NB)
#> GAMLSS-RS iteration 1: Global Deviance = 535713.5
#> GAMLSS-RS iteration 2: Global Deviance = 535713.4
#> GAMLSS-RS iteration 3: Global Deviance = 535713.4
#> df AIC
#> m1_bnb 10 535363.2
#> m1_NB 9 535731.4
Once again we conclude the BNB fits better than the NB.
give.n <- function(x) {
return(c(y = 8, label = length(x)))
}
df1 <- df3
df1covid <- df1[df1$covid == 1, ]
df1nocovid <- df1[df1$covid == 0, ]
Figure4 <- ggplot(data = df1, aes(x = time, y = npubs)) + geom_boxplot(aes(group = cut_width(time, 1)),
show.legend = FALSE, outlier.alpha = 0.01, col = "darkgrey") + stat_summary(data = df1covid, fun = mean,
geom = "line", aes(group = 1), col = "blue", size = 1.2, linetype = 1) + stat_summary(data = df1nocovid,
fun = mean, geom = "line", aes(group = 1), col = "orange", size = 1.2, linetype = 1) + stat_summary(fun = mean,
geom = "point", col = "darkgrey", size = 2) + stat_summary(fun.data = give.n, geom = "text", fun.y = median,
position = position_dodge(width = 0.75), size = 1.8, col = "darkgrey") + scale_y_continuous(limits = c(0,
20)) + labs(x = "career age", y = "number of publications", caption = "Note: \n
The box plots summarize the distribution of research output at different career ages for all scholars \n
(line = median; point = mean; hinges correspond to the first and third quartiles; whiskers at 1.5*IQR; not all outliers shown). \n
Orange line refers to mean number for scholars who did not experience COVID-19 at that career age. \n
Blue line refers to mean number for scholars who experience COVID-19 at that career age.") +
theme_minimal() + theme(plot.background = element_rect(colour = "black", fill = NA, size = 1)) +
theme(plot.caption = element_text(hjust = 0))
# suppressWarnings(print(Figure4)) fsave(Figure4, 'Figure4')
Figure4
df1 <- df3 %>%
filter(gender2 == "men")
df1covid <- df1[df1$covid == 1, ]
df1nocovid <- df1[df1$covid == 0, ]
Figure4_m <- ggplot(data = df1, aes(x = time, y = npubs)) + geom_boxplot(aes(group = cut_width(time,
1)), show.legend = FALSE, outlier.alpha = 0.01, col = "darkgrey") + stat_summary(data = df1covid,
fun = mean, geom = "line", aes(group = 1), col = "blue", size = 1.2, linetype = 1) + stat_summary(data = df1nocovid,
fun = mean, geom = "line", aes(group = 1), col = "orange", size = 1.2, linetype = 1) + stat_summary(fun = mean,
geom = "point", col = "darkgrey", size = 2) + scale_y_continuous(limits = c(0, 20)) + labs(x = "career age",
y = "number of publications", caption = "Note: \n
The box plots summarize the distribution of research output at different career ages for all scholars \n
(line = median; point = mean; hinges correspond to the first and third quartiles; whiskers at 1.5*IQR; not all outliers shown). \n
Orange line refers to mean number for scholars who did not experience COVID-19 at that career age. \n
Blue line refers to mean number for scholars who experience COVID-19 at that career age.") +
theme_minimal() + theme(plot.background = element_rect(colour = "black", fill = NA, size = 1)) +
theme(plot.caption = element_text(hjust = 0))
# suppressWarnings(print(Figure4)) fsave(Figure4, 'Figure4')
Figure4_m
give.n <- function(x) {
return(c(y = median(x) * 0.6, label = length(x)))
}
give.n <- function(x) {
return(c(y = 8, label = length(x)))
}
df1 <- df3 %>%
filter(gender2 == "women")
df1covid <- df1[df1$covid == 1, ]
df1nocovid <- df1[df1$covid == 0, ]
Figure4_w <- ggplot(data = df1, aes(x = time, y = npubs)) + geom_boxplot(aes(group = cut_width(time,
1)), show.legend = FALSE, outlier.alpha = 0.01, col = "darkgrey") + stat_summary(data = df1covid,
fun = mean, geom = "line", aes(group = 1), col = "blue", size = 1.2, linetype = 1) + stat_summary(data = df1nocovid,
fun = mean, geom = "line", aes(group = 1), col = "orange", size = 1.2, linetype = 1) + stat_summary(fun = mean,
geom = "point", col = "darkgrey", size = 2) + scale_y_continuous(limits = c(0, 20)) + labs(x = "career age",
y = "number of publications", caption = "Note: \n
The box plots summarize the distribution of research output at different career ages for all scholars \n
(line = median; point = mean; hinges correspond to the first and third quartiles; whiskers at 1.5*IQR; not all outliers shown). \n
Orange line refers to mean number for scholars who did not experience COVID-19 at that career age. \n
Blue line refers to mean number for scholars who experience COVID-19 at that career age.") +
theme_minimal() + theme(plot.background = element_rect(colour = "black", fill = NA, size = 1)) +
theme(plot.caption = element_text(hjust = 0))
# suppressWarnings(print(Figure4)) fsave(Figure4, 'Figure4')
Figure4_w
df1 <- df3
df1covid <- df1[df1$covid == 1, ]
df1nocovid <- df1[df1$covid == 0, ]
Figure4 <- ggplot(data = df1, aes(x = time, y = npubs)) + geom_boxplot(aes(group = cut_width(time, 1)),
show.legend = FALSE, outlier.alpha = 0.01, col = "darkgrey") + stat_summary(data = df1covid, fun = mean,
geom = "line", aes(group = 1), col = "blue", size = 1.2, linetype = 1) + stat_summary(data = df1nocovid,
fun = mean, geom = "line", aes(group = 1), col = "orange", size = 1.2, linetype = 1) + stat_summary(fun = mean,
geom = "point", col = "darkgrey", size = 2) + scale_y_continuous(limits = c(0, 20)) + labs(x = "career age",
y = "number of publications", caption = " ") + theme_minimal() + theme(plot.caption = element_text(hjust = 0)) +
theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
df1 <- df3 %>%
filter(gender2 == "men")
df1covid <- df1[df1$covid == 1, ]
df1nocovid <- df1[df1$covid == 0, ]
Figure4_m <- ggplot(data = df1, aes(x = time, y = npubs)) + geom_boxplot(aes(group = cut_width(time,
1)), show.legend = FALSE, outlier.alpha = 0.01, col = "darkgrey") + stat_summary(data = df1covid,
fun = mean, geom = "line", aes(group = 1), col = "blue", size = 1.2, linetype = 1) + stat_summary(data = df1nocovid,
fun = mean, geom = "line", aes(group = 1), col = "orange", size = 1.2, linetype = 1) + stat_summary(fun = mean,
geom = "point", col = "darkgrey", size = 2) + scale_y_continuous(limits = c(0, 20)) + labs(x = "career age",
y = "number of publications", caption = " ") + theme_minimal() + theme(plot.caption = element_text(hjust = 0)) +
theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
df1 <- df3 %>%
filter(gender2 == "women")
df1covid <- df1[df1$covid == 1, ]
df1nocovid <- df1[df1$covid == 0, ]
Figure4_w <- ggplot(data = df1, aes(x = time, y = npubs)) + geom_boxplot(aes(group = cut_width(time,
1)), show.legend = FALSE, outlier.alpha = 0.01, col = "darkgrey") + stat_summary(data = df1covid,
fun = mean, geom = "line", aes(group = 1), col = "blue", size = 1.2, linetype = 1) + stat_summary(data = df1nocovid,
fun = mean, geom = "line", aes(group = 1), col = "orange", size = 1.2, linetype = 1) + stat_summary(fun = mean,
geom = "point", col = "darkgrey", size = 2) + scale_y_continuous(limits = c(0, 20)) + labs(x = "career age",
y = "number of publications", caption = " ") + theme_minimal() + theme(plot.caption = element_text(hjust = 0)) +
theme(plot.margin = margin(t = 1, r = 1, b = 1, l = 1, unit = "cm"))
Figure4_revision <- ggarrange(Figure4, ggarrange(Figure4_m, Figure4_w, ncol = 2, labels = c("men", "women"),
hjust = c(-2.5, -1.5)), nrow = 2, labels = "total", hjust = -3)
Figure4_revision <- annotate_figure(Figure4_revision, bottom = text_grob("Notes: \n
The box plots summarize the distribution of research output at different career ages for all scholars \n
(line = median; point = mean; hinges correspond to the first and third quartiles; whiskers at 1.5*IQR; not all outliers shown). \n
Orange line refers to mean number for scholars who did not experience COVID-19 at that career age. \n
Blue line refers to mean number for scholars who experience COVID-19 at that career age.",
color = "black", just = "left", x = 0.05, y = 0.95, size = 7, lineheight = 0.6))
Figure4_revision
Figure 4. Observed distribution of yearly number of publications at different career ages
# #now find a way to save correctly { pdf(file = './data/processed/20250531Figure4_rev.pdf', width
# = 10, height =10) Figure4_revision } dev.off() { png(file =
# './data/processed/20250531Figure4_rev.png', width = 1600, height = 1600, units = 'px', res = 200)
# Figure4_revision } dev.off()
df3 <- df_ppf[, c("npubs", "npubs_a", "npubs_first_a", "npubs_mid_a", "npubs_last_a", "time", "id", "covid",
"covid2020", "covid2021", "gender2", "phd_year0", "c2005", "c2010", "ethnicity", "uni", "life_domain",
"physical_domain", "social_domain")]
df3 <- na.omit(df3)
nrow(df3)
length(unique(df3$id))
knots5 <- quantile(df3$time, probs = seq(0, 1, 0.25))[2:4]
con <- gamlss.control(n.cyc = 150)
# Model 1: only main effects
m1 <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 + ethnicity +
life_domain + physical_domain + social_domain + uni, data = df3, family = BNB, control = con)
fsave(m1, "m1")
sm1 <- summary(m1)
fsave(sm1, "sm1")
# Model 2: hypo1 covid X gender
m2 <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 + ethnicity +
life_domain + physical_domain + social_domain + uni + covid * gender2, data = df3, family = BNB,
control = con)
fsave(m2, "m2")
sm2 <- summary(m2)
fsave(sm2, "sm2")
# Model 3: Hypo2: covid X gender X c2005
m3 <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 + ethnicity +
life_domain + physical_domain + social_domain + uni + covid * gender2 + covid * c2005 * gender2,
data = df3, family = BNB, control = con)
fsave(m3, "m3")
sm3 <- summary(m3)
fsave(sm3, "sm3")
# #Model 3b: Hypo2: covid X gender X smooth5 m3b <- gamlss(npubs ~ bSpline(time, knots=knots5,df=3)
# + phd_year0 + covid + gender2 + ethnicity + life_domain + physical_domain + social_domain + uni +
# covid*gender2 + covid*smooth5*gender2, data = df3, family = BNB, control=con) fsave(m3b, 'm3b')
# sm3b <- summary(m3b) fsave(sm3b, 'sm3b')
# Model 4: question 2: domains
m4 <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 + ethnicity +
life_domain + physical_domain + social_domain + uni + covid * gender2 + covid * c2005 * gender2 +
covid * life_domain + covid * physical_domain + covid * social_domain, data = df3, family = BNB,
control = con)
fsave(m4, "m4")
sm4 <- summary(m4)
fsave(sm4, "sm4")
# Model 5: all other covid interactions
m5 <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 + ethnicity +
life_domain + physical_domain + social_domain + uni + covid * gender2 + covid * c2005 * gender2 +
covid * life_domain + covid * physical_domain + covid * social_domain + covid * ethnicity + covid *
uni, data = df3, family = BNB, control = con)
fsave(m5, "m5")
sm5 <- summary(m5)
fsave(sm5, "sm5")
rs1 <- NA #Efron's R-squared
rs2 <- NA # Nagelkerke R-squared
rs1[1] <- efronsquared(actual = m1$y, predicted = predict(m1, type = "response"))
rs1[2] <- efronsquared(actual = m2$y, predicted = predict(m2, type = "response"))
rs1[3] <- efronsquared(actual = m3$y, predicted = predict(m3, type = "response"))
rs1[4] <- efronsquared(actual = m4$y, predicted = predict(m4, type = "response"))
rs1[5] <- efronsquared(actual = m5$y, predicted = predict(m5, type = "response"))
rs1
rs2[1] <- Rsq(m1, "Cragg Uhler")
rs2[2] <- Rsq(m2, "Cragg Uhler")
rs2[3] <- Rsq(m3, "Cragg Uhler")
rs2[4] <- Rsq(m4, "Cragg Uhler")
rs2[5] <- Rsq(m5, "Cragg Uhler")
rs2
# see here: https://stats.oarc.ucla.edu/other/mult-pkg/faq/general/faq-what-are-pseudo-r-squareds/
rs3_tot <- AIC(m1, m2, m3, m4, m5)
rs3 <- NA
rs3[1] <- paste(as.character(round(rs3_tot$AIC[5])), " (df=", as.character(rs3_tot$df[5]), ")", sep = "")
rs3[2] <- paste(as.character(round(rs3_tot$AIC[4])), " (df=", as.character(rs3_tot$df[4]), ")", sep = "")
rs3[3] <- paste(as.character(round(rs3_tot$AIC[3])), " (df=", as.character(rs3_tot$df[3]), ")", sep = "")
rs3[4] <- paste(as.character(round(rs3_tot$AIC[2])), " (df=", as.character(rs3_tot$df[2]), ")", sep = "")
rs3[5] <- paste(as.character(round(rs3_tot$AIC[1])), " (df=", as.character(rs3_tot$df[1]), ")", sep = "")
df_fits <- data.frame(rs1 = rs1, rs2 = rs2, rs3 = rs3)
# fsave(df_fits)
#> [1] 0.07658464 0.07663552 0.08812155 0.08845661 0.09104171
#> [1] 0.1066144 0.1066931 0.1116464 0.1119289 0.1181027
r1 <- as.data.frame(sm1)[, c(1, 2, 4)]
r1$names <- rownames(r1)
r2 <- as.data.frame(sm2)[, c(1, 2, 4)]
r2$names <- rownames(r2)
r3 <- as.data.frame(sm3)[, c(1, 2, 4)]
r3$names <- rownames(r3)
r4 <- as.data.frame(sm4)[, c(1, 2, 4)]
r4$names <- rownames(r4)
r5 <- as.data.frame(sm5)[, c(1, 2, 4)]
r5$names <- rownames(r5)
res <- right_join(r1, r2, by = c("names"))
res <- right_join(res, r3, by = c("names"))
res <- right_join(res, r4, by = c("names"))
res <- right_join(res, r5, by = c("names"))
res
resmu <- res[-c(31, 32), ]
ressigtau <- res[c(31, 32), ]
res <- rbind(resmu, ressigtau)
rownames(res) <- res$names
res <- res[, -4]
colnames(res) <- rep(c("Estimate", "Std.Error", "Pr(>|t)"), 5)
# fsave(res, 'Table2_raw')
Table2_raw <- res
#> Estimate.x Std. Error.x Pr(>|t|).x names Estimate.y
#> 1 1.45575594 0.0203399396 0.000000e+00 X.Intercept. 1.456092276
#> 2 -0.43886375 0.0257110671 3.042506e-65 bSpline.time..knots...knots5..df...3.1 -0.439095150
#> 3 -0.33695460 0.0203276949 1.225171e-61 bSpline.time..knots...knots5..df...3.2 -0.337636899
#> 4 -0.22689603 0.0195750462 4.760741e-31 bSpline.time..knots...knots5..df...3.3 -0.227173426
#> 5 0.04679990 0.0304431443 1.242254e-01 bSpline.time..knots...knots5..df...3.4 0.046305021
#> 6 0.01196853 0.0449858735 7.902006e-01 bSpline.time..knots...knots5..df...3.5 0.011191380
#> 7 -0.61833445 0.0515917171 4.450587e-33 bSpline.time..knots...knots5..df...3.6 -0.614347140
#> 8 -0.01905936 0.0005890527 1.259630e-228 phd_year0 -0.019047448
#> 9 -0.40924981 0.0113029181 1.984857e-285 covid -0.410673773
#> 10 -0.12601939 0.0070918007 1.511319e-70 gender2women -0.127199592
#> 11 -0.60777949 0.0422422554 6.773095e-47 gender2no.first.name -0.570210826
#> 12 -0.20777594 0.0772646051 7.164516e-03 gender2missing -0.186356104
#> 13 -0.25443662 0.0347178499 2.339329e-13 ethnicityminority -0.254338394
#> 14 -0.18251588 0.0139807482 6.364267e-39 ethnicityother -0.182387726
#> 15 -0.09299558 0.0104107739 4.220101e-19 ethnicitymissing -0.093003380
#> 16 -0.17872154 0.0141717983 1.940989e-36 life_domain -0.178683022
#> 17 -0.09934534 0.0130412124 2.600187e-14 physical_domain -0.099480716
#> 18 -0.24493760 0.0110892444 6.982911e-108 social_domain -0.244967366
#> 19 0.28513604 0.0311717209 5.931897e-20 uniLU 0.284648385
#> 20 0.52807040 0.0148795997 2.281107e-274 uniRU 0.528023789
#> 21 0.76437035 0.0193589893 0.000000e+00 uniRUG 0.764505435
#> 22 0.82995584 0.0577932626 1.002222e-46 uniTUD 0.829603421
#> 23 0.74348871 0.0224370769 1.234536e-239 uniTUE 0.743502165
#> 24 0.46255805 0.0408861220 1.169280e-29 uniTI 0.462376837
#> 25 0.52757815 0.0163436758 1.425277e-227 uniUM 0.527619151
#> 26 0.14536184 0.0219289706 3.400271e-11 uniUT 0.145307524
#> 27 0.26115288 0.0182531521 2.162658e-46 uniUU 0.261009756
#> 28 0.49267269 0.0170923489 4.852125e-182 uniUvA 0.492617515
#> 29 0.58056580 0.0183160802 1.554926e-219 uniVU 0.580750925
#> 30 0.67623211 0.0167410443 0.000000e+00 uniWUR 0.676271961
#> 31 -1.26574393 0.0308323109 0.000000e+00 X.Intercept..1 -1.264826682
#> 32 -2.18301752 0.0488962768 0.000000e+00 X.Intercept..2 -2.181399778
#> 33 NA NA NA covid.gender2women 0.009694999
#> 34 NA NA NA covid.gender2no.first.name -0.483455726
#> 35 NA NA NA covid.gender2missing -0.194979852
#> 36 NA NA NA c2005 NA
#> 37 NA NA NA covid.c2005 NA
#> 38 NA NA NA gender2women.c2005 NA
#> 39 NA NA NA gender2no.first.name.c2005 NA
#> 40 NA NA NA gender2missing.c2005 NA
#> 41 NA NA NA covid.gender2women.c2005 NA
#> 42 NA NA NA covid.gender2no.first.name.c2005 NA
#> 43 NA NA NA covid.gender2missing.c2005 NA
#> 44 NA NA NA covid.life_domain NA
#> 45 NA NA NA covid.physical_domain NA
#> 46 NA NA NA covid.social_domain NA
#> 47 NA NA NA covid.ethnicityminority NA
#> 48 NA NA NA covid.ethnicityother NA
#> 49 NA NA NA covid.ethnicitymissing NA
#> 50 NA NA NA covid.uniLU NA
#> 51 NA NA NA covid.uniRU NA
#> 52 NA NA NA covid.uniRUG NA
#> 53 NA NA NA covid.uniTUD NA
#> 54 NA NA NA covid.uniTUE NA
#> 55 NA NA NA covid.uniTI NA
#> 56 NA NA NA covid.uniUM NA
#> 57 NA NA NA covid.uniUT NA
#> 58 NA NA NA covid.uniUU NA
#> 59 NA NA NA covid.uniUvA NA
#> 60 NA NA NA covid.uniVU NA
#> 61 NA NA NA covid.uniWUR NA
#> Std. Error.y Pr(>|t|).y Estimate.x.x Std. Error.x.x Pr(>|t|).x.x Estimate.y.y Std. Error.y.y
#> 1 0.0203511748 0.000000e+00 1.323771588 0.025002935 0.000000e+00 1.311657716 0.025208294
#> 2 0.0257124169 2.649106e-65 -0.353230350 0.030654607 1.051878e-30 -0.353196847 0.030654845
#> 3 0.0203314975 7.387019e-62 -0.233846308 0.023862172 1.150805e-22 -0.233452453 0.023868395
#> 4 0.0195769510 4.088673e-31 -0.017761802 0.023798778 4.554681e-01 -0.015851177 0.023801760
#> 5 0.0304439195 1.282641e-01 0.227676236 0.036478694 4.353376e-10 0.229387181 0.036485145
#> 6 0.0449867305 8.035386e-01 0.239974780 0.053634900 7.676202e-06 0.244821692 0.053637024
#> 7 0.0516329745 1.262218e-32 -0.436448970 0.060954028 8.098663e-13 -0.438738984 0.060953577
#> 8 0.0005893837 4.314205e-228 -0.019305447 0.001074494 4.445611e-72 -0.019307017 0.001074585
#> 9 0.0141842483 1.207441e-183 -0.283360608 0.022528828 2.961319e-36 -0.188004663 0.032348568
#> 10 0.0074954828 1.640033e-64 -0.160812117 0.011368380 2.173898e-45 -0.161625450 0.011374984
#> 11 0.0435973539 4.631228e-39 -0.673686690 0.052314498 6.394636e-38 -0.676278445 0.052323685
#> 12 0.0814786085 2.218725e-02 -0.002381488 0.104757800 9.818631e-01 -0.004120839 0.104744337
#> 13 0.0347205252 2.399270e-13 -0.316802841 0.039231069 6.795944e-16 -0.317037748 0.039220178
#> 14 0.0139813348 7.228344e-39 -0.195633018 0.015685799 1.120202e-35 -0.195415976 0.015685342
#> 15 0.0104113870 4.211593e-19 -0.091347807 0.011884608 1.527421e-14 -0.090846884 0.011885739
#> 16 0.0141729218 2.034596e-36 -0.307402708 0.017201304 2.489739e-71 -0.295684035 0.018181626
#> 17 0.0130424326 2.412605e-14 -0.146787183 0.015352346 1.185788e-21 -0.137729987 0.016098165
#> 18 0.0110900350 6.814406e-108 -0.357036159 0.013113144 1.029573e-162 -0.331529649 0.013822079
#> 19 0.0311758392 6.931149e-20 0.286621153 0.035063796 3.006693e-16 0.287255996 0.035077786
#> 20 0.0148807907 2.813836e-274 0.614324558 0.016669239 1.429026e-295 0.612941304 0.016657537
#> 21 0.0193607423 0.000000e+00 0.813455137 0.022545449 1.847958e-283 0.810771792 0.022542988
#> 22 0.0577954312 1.102730e-46 0.904316862 0.068279252 5.206200e-40 0.900743444 0.068436663
#> 23 0.0224404912 1.428567e-239 0.871179020 0.026122878 1.117267e-242 0.869818289 0.026127763
#> 24 0.0408890257 1.241091e-29 0.519623044 0.046102099 1.888825e-29 0.519179137 0.046128643
#> 25 0.0163448906 1.420396e-227 0.601047805 0.018427100 2.749447e-232 0.599051925 0.018419484
#> 26 0.0219302543 3.466856e-11 0.240548151 0.024136915 2.195323e-23 0.238517931 0.024122527
#> 27 0.0182542646 2.450597e-46 0.288439839 0.020286757 7.741888e-46 0.286672020 0.020276517
#> 28 0.0170940389 5.775138e-182 0.566980863 0.019180560 2.590209e-191 0.564995257 0.019173411
#> 29 0.0183173767 1.214280e-219 0.643778496 0.020663420 3.367391e-212 0.642381086 0.020656867
#> 30 0.0167425271 0.000000e+00 0.733809653 0.019005658 0.000000e+00 0.731561311 0.019000048
#> 31 0.0308283098 0.000000e+00 -1.537856128 0.035300824 0.000000e+00 -1.549151206 0.035658605
#> 32 0.0489308097 0.000000e+00 -0.235724415 0.015763230 1.636797e-50 -0.231982170 0.015688601
#> 33 0.0215188372 6.523253e-01 0.068038144 0.037520789 6.978123e-02 0.072766629 0.037676641
#> 34 0.1730527766 5.211920e-03 -0.671472670 0.213444251 1.656235e-03 -0.643852834 0.212941642
#> 35 0.2558176384 4.459524e-01 -0.539359950 0.376936449 1.524604e-01 -0.511934071 0.374823284
#> 36 NA NA -0.012983453 0.016343704 4.269637e-01 -0.012668983 0.016341898
#> 37 NA NA -0.247863871 0.030731484 7.365685e-16 -0.245198927 0.030770871
#> 38 NA NA -0.046930298 0.017166624 6.261574e-03 -0.046365849 0.017163930
#> 39 NA NA -0.136810226 0.134050604 3.074526e-01 -0.141574309 0.134020850
#> 40 NA NA -0.826657427 0.226760317 2.669789e-04 -0.824499355 0.226681972
#> 41 NA NA -0.010107149 0.048552944 8.350985e-01 -0.014434385 0.048559326
#> 42 NA NA 0.249760802 0.385571742 5.171367e-01 0.273135209 0.385159218
#> 43 NA NA 0.971453358 0.562389440 8.410436e-02 0.924638638 0.563019654
#> 44 NA NA NA NA NA -0.095217955 0.046062004
#> 45 NA NA NA NA NA -0.070479838 0.039300261
#> 46 NA NA NA NA NA -0.215427624 0.036937461
#> 47 NA NA NA NA NA NA NA
#> 48 NA NA NA NA NA NA NA
#> 49 NA NA NA NA NA NA NA
#> 50 NA NA NA NA NA NA NA
#> 51 NA NA NA NA NA NA NA
#> 52 NA NA NA NA NA NA NA
#> 53 NA NA NA NA NA NA NA
#> 54 NA NA NA NA NA NA NA
#> 55 NA NA NA NA NA NA NA
#> 56 NA NA NA NA NA NA NA
#> 57 NA NA NA NA NA NA NA
#> 58 NA NA NA NA NA NA NA
#> 59 NA NA NA NA NA NA NA
#> 60 NA NA NA NA NA NA NA
#> 61 NA NA NA NA NA NA NA
#> Pr(>|t|).y.y Estimate Std. Error Pr(>|t|)
#> 1 0.000000e+00 1.28602410 0.025493520 0.000000e+00
#> 2 1.066399e-30 -0.36994245 0.030572208 1.099511e-33
#> 3 1.389265e-22 -0.23344116 0.023815011 1.123866e-22
#> 4 5.054338e-01 -0.01595815 0.023707280 5.008642e-01
#> 5 3.245378e-10 0.21487494 0.036394613 3.557267e-09
#> 6 5.014098e-06 0.25692926 0.053515481 1.580543e-06
#> 7 6.151348e-13 -0.48704500 0.060954823 1.359017e-15
#> 8 4.450927e-72 -0.01982464 0.001071992 3.028510e-76
#> 9 6.195455e-09 0.11076945 0.049820789 2.619363e-02
#> 10 8.837608e-46 -0.16184825 0.011337989 3.441710e-46
#> 11 3.465541e-38 -0.69459133 0.052204549 2.315152e-40
#> 12 9.686179e-01 -0.02313385 0.104328007 8.245155e-01
#> 13 6.352620e-16 -0.29414327 0.042311284 3.623626e-12
#> 14 1.326178e-35 -0.17536086 0.016844603 2.279479e-25
#> 15 2.132861e-14 -0.08348730 0.012717338 5.231127e-11
#> 16 2.116037e-59 -0.29553345 0.018316596 1.689454e-58
#> 17 1.186502e-17 -0.15334016 0.016323628 5.892039e-21
#> 18 8.154112e-127 -0.33734467 0.013891404 6.151851e-130
#> 19 2.658468e-16 0.28264450 0.038764692 3.089919e-13
#> 20 1.145540e-294 0.66589193 0.017595428 1.850043e-311
#> 21 1.117836e-281 0.82353938 0.023642982 1.972762e-264
#> 22 1.557972e-39 0.74000773 0.085324937 4.269657e-18
#> 23 7.667404e-242 0.90742571 0.027411313 3.597312e-239
#> 24 2.267318e-29 0.59899056 0.049428216 8.854866e-34
#> 25 5.889178e-231 0.59407167 0.019536919 2.833788e-202
#> 26 4.805899e-23 0.32186052 0.025490690 1.594269e-36
#> 27 2.415638e-45 0.44072106 0.021608022 2.647467e-92
#> 28 3.906759e-190 0.62544742 0.020234390 6.452122e-209
#> 29 2.006338e-211 0.66885088 0.021924363 1.395613e-203
#> 30 2.964394e-322 0.75369311 0.020098084 6.723538e-306
#> 31 0.000000e+00 -1.55006135 0.034623487 0.000000e+00
#> 32 1.985199e-49 -0.24411748 0.015476424 5.429694e-56
#> 33 5.344276e-02 0.07431282 0.037944145 5.017624e-02
#> 34 2.498325e-03 -0.46287705 0.215042987 3.136118e-02
#> 35 1.720041e-01 -0.34986682 0.375032157 3.508745e-01
#> 36 4.381962e-01 -0.02426774 0.016319563 1.370087e-01
#> 37 1.620330e-15 -0.13585785 0.031946662 2.114278e-05
#> 38 6.906805e-03 -0.04479391 0.017106478 8.832004e-03
#> 39 2.908059e-01 -0.12744549 0.133656569 3.403239e-01
#> 40 2.756845e-04 -0.81848458 0.226002086 2.929368e-04
#> 41 7.662742e-01 -0.01624743 0.048912043 7.397567e-01
#> 42 4.782336e-01 0.16073633 0.386791058 6.777301e-01
#> 43 1.005338e-01 0.80718295 0.571305399 1.576953e-01
#> 44 3.872047e-02 -0.09573531 0.051082801 6.091642e-02
#> 45 7.291673e-02 0.05863176 0.047103926 2.132329e-01
#> 46 5.484009e-09 -0.17333121 0.040161636 1.591309e-05
#> 47 NA -0.18330258 0.113564522 1.065122e-01
#> 48 NA -0.16178270 0.045546894 3.824651e-04
#> 49 NA -0.07221484 0.034903332 3.854877e-02
#> 50 NA -0.15489139 0.090056697 8.544753e-02
#> 51 NA -0.47091242 0.052155169 1.757543e-19
#> 52 NA -0.06375577 0.073818020 3.877609e-01
#> 53 NA 0.10699559 0.142865271 4.539030e-01
#> 54 NA -0.30686934 0.087335045 4.420794e-04
#> 55 NA -0.64812502 0.137935716 2.620682e-06
#> 56 NA -0.02344246 0.055698561 6.738429e-01
#> 57 NA -0.76542832 0.078199532 1.292309e-22
#> 58 NA -1.15996038 0.062010302 5.803160e-78
#> 59 NA -0.55677017 0.061315816 1.098765e-19
#> 60 NA -0.24923004 0.062258983 6.255279e-05
#> 61 NA -0.21607909 0.057919796 1.910713e-04
Table2_raw <- Table2_raw[-c(2:7, 11, 12, 15, 19:30, 32, 33, 37, 38, 40, 41, 47:61), ]
Table2_raw <- Table2_raw[c(1, 3, 4, 7, 8, 9, 2, 5, 6, 10:19), ]
rownames(Table2_raw) <- c("Intercept", "COVID-19 years", "gender: women", "domain: Life", "domain: Physical",
"domain: Social", "PhD-cohort", "ethnicity: minority I", "ethnicity: minority II", "COVID*women",
"PhD after 2005", "COVID*PhD>2005", "women*PhD>2005", "COVID*women*PhD>2005", "COVID*Life", "COVID*Physical",
"COVID*Social", "COVID*minority I", "COVID*minority II")
Table2 <- cbind(rownames(Table2_raw), Table2_raw)
colnames(Table2) <- as.character(1:16)
table2ft <- flextable(Table2) %>%
add_header_row(values = c(" ", rep(c("Estimate", "Std.Error", "Pr(>|t)"), 5)), top = FALSE) %>%
delete_rows(i = 1, part = "header") %>%
# set_caption( 'Predicting yearly publication output per year (Negative Beta Binomial)') %>%
add_footer_lines(value = c("Notes: \nFor reasons of parsimony, the estimates of the following variables are not shown: bsplines; gender: no first name; gender: missing; ethnicity: missing; university. Similarly, the estimated shape parameters (sigma and nu) are not shown. \n N_person-years = 113.782; N_persons = 8.289")) %>%
width(j = 1, width = 2) %>%
align(i = 1, align = "center", part = "header") %>%
colformat_double(digits = 3) %>%
add_header_row(values = c(" ", "Model 1", "Model 2", "Model 3", "Model 4", "Model 5"), colwidths = c(1,
3, 3, 3, 3, 3)) %>%
fontsize(size = 8, part = "all") %>%
set_table_properties(layout = "autofit")
table2ft <- add_body_row(table2ft, values = c("Efron's R-squared", round(df_fits$rs1, 3)), colwidths = c(1,
rep(3, 5)), top = FALSE) %>%
align(i = 20, j = c(2:16), align = "center", part = "body")
table2ft <- add_body_row(table2ft, values = c("AIC (df)", df_fits$rs3), colwidths = c(1, rep(3, 5)),
top = FALSE) %>%
align(i = 21, j = c(2:16), align = "center", part = "body")
table2ft %>%
border_inner_h(border = fp_border_default(width = 0), part = "body") %>%
hline(i = 19)
Table2_raw <- fload("./data/processed/Table2_raw_20241221.rda")
# include uni and uni*covid (model 5)
Table2_raw <- Table2_raw[-c(2:7, 11, 12, 15, 32, 33, 37, 38, 40, 41, 47, 60:61), ]
Table2_raw <- Table2_raw[c(1, 3, 4, 7, 8, 9, 2, 5, 6, 22:31, 10:21, 32:43), ]
rownames(Table2_raw) <- c("Intercept", "COVID-19 years", "gender: women", "domain: Life", "domain: Physical",
"domain: Social", "PhD-cohort", "ethnicity: minority I", "ethnicity: minority II", "COVID*women",
"PhD after 2005", "COVID*PhD>2005", "women*PhD>2010", "COVID*women*PhD>2010", "COVID*Life", "COVID*Physical",
"COVID*Social", "COVID*minority I", "COVID*minority II", "university: LU", "university: RU", "university: RUG",
"university: TUD", "university: TUE", "university: TI", "university: UM", "university: UT", "university: UU",
"university: UvA", "university: VU", "university: WUR", "COVID*LU", "COVID*RU", "COVID*RUG", "COVID*TUD",
"COVID*TUE", "COVID*TI", "COVID*UM", "COVID*UT", "COVID*UU", "COVID*UvA", "COVID*VU", "COVID*WUR")
Table2 <- cbind(rownames(Table2_raw), Table2_raw)
colnames(Table2) <- as.character(1:16)
# remove Model 1:4
Table2 <- Table2[, c(1, 14:16)]
Appendix3 <- flextable(Table2) %>%
add_header_row(values = c(" ", "B", "S.E.", "P"), top = FALSE) %>%
delete_rows(i = 1, part = "header") %>%
add_header_row(values = c(" ", "Model 5"), colwidths = c(1, 3)) %>%
# set_caption( 'Predicting yearly publication output per year (Negative Beta Binomial)') %>%
add_footer_lines(value = c("Note: For reasons of parsimony, the estimates of the following variables are not shown: bsplines; gender: no first name; gender: missing; ethnicity: missing. Similarly, the estimated shape parameters (sigma and nu) are not shown.")) %>%
align(i = 1, align = "center", part = "header") %>%
align(i = 2, align = "center", part = "header") %>%
colformat_double(digits = 3) %>%
fontsize(size = 8, part = "all") %>%
set_table_properties(opts_pdf = list(arraystretch = 1)) %>%
width(j = 1, width = 1.3) %>%
width(j = 2:4, width = 0.4)
Appendix3 <- add_body_row(Appendix3, values = c("Efron's R-squared", round(df_fits$rs1[5], 3)), colwidths = c(1,
3), top = FALSE) %>%
align(i = 44, j = c(2:4), align = "center", part = "body")
Appendix3 <- add_body_row(Appendix3, values = c("AIC (df)", df_fits$rs3[5]), colwidths = c(1, 3), top = FALSE) %>%
align(i = 45, j = c(2:4), align = "center", part = "body")
Appendix3 <- Appendix3 %>%
border_inner_h(border = fp_border_default(width = 0), part = "body") %>%
hline(i = 43)
Appendix3
Based on Model 1
df_c0 <- df3
df_c0$covid <- 0
df_c1 <- df3
df_c1$covid <- 1
c0 <- predict(m1, newdata = df_c0, type = "response")
c1 <- predict(m2, newdata = df_c1, type = "response")
mean(c0)
mean(c1)
mean(c0 - c1)
#> [1] 3.733691
#> [1] 2.478322
#> [1] 1.255368
Based on Model 2
df_c0 <- df3
df_c0$covid <- 0
df_c1 <- df3
df_c1$covid <- 1
df_c0m <- df_c0
df_c0m$gender2 <- factor("men", levels = c("men", "women", "no first name", "missing"))
levels(df_c0m$gender2) <- levels(df3$gender2)
df_c0w <- df_c0
df_c0w$gender2 <- factor("women", levels = c("men", "women", "no first name", "missing"))
df_c1m <- df_c1
df_c1m$gender2 <- factor("men", levels = c("men", "women", "no first name", "missing"))
df_c1w <- df_c1
df_c1w$gender2 <- factor("women", levels = c("men", "women", "no first name", "missing"))
c0m <- predict(m2, newdata = df_c0m, type = "response")
c0w <- predict(m2, newdata = df_c0w, type = "response")
c1m <- predict(m2, newdata = df_c1m, type = "response")
c1w <- predict(m2, newdata = df_c1w, type = "response")
mean(c0m)
mean(c0w)
mean(c1m)
mean(c1w)
mean(c0w - c0m) #AME gender non-covid
mean(c1w - c1m) #AME gender covid
mean(c0w - c1w) #AME covid women
mean(c0m - c1m) #AME covid men
mean(c1w - c1m - (c0w - c0m)) #AME interaction effect (par. 1)
mean(c0m - c1m - (c0w - c1w)) #AME interaction effect (par. 2)
#> [1] 3.910017
#> [1] 3.442996
#> [1] 2.593136
#> [1] 2.305651
#> [1] -0.4670206
#> [1] -0.2874843
#> [1] 1.137345
#> [1] 1.316881
#> [1] 0.1795363
#> [1] 0.1795363
Not included in manuscript. We refer to this replication website. Building on Model 2
m2_r1 <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid2020 + covid2021 + gender2 +
ethnicity + life_domain + physical_domain + social_domain + uni + covid2020 * gender2 + covid2021 *
gender2, data = df3, family = BNB, control = con)
fsave(m2_r1, "m2_r1")
sm2_r1 <- summary(m2_r1)
fsave(sm2_r1, "sm2_r1")
fshowdf(sm2_r1)
Estimate | Std. Error | t value | Pr(>|t|) | |
---|---|---|---|---|
(Intercept) | 1.344 | 0.025 | 54.811 | 0.000 |
bSpline(time, knots = knots5, df = 3)1 | -0.375 | 0.031 | -12.266 | 0.000 |
bSpline(time, knots = knots5, df = 3)2 | -0.229 | 0.024 | -9.632 | 0.000 |
bSpline(time, knots = knots5, df = 3)3 | -0.050 | 0.024 | -2.107 | 0.035 |
bSpline(time, knots = knots5, df = 3)4 | 0.265 | 0.036 | 7.306 | 0.000 |
bSpline(time, knots = knots5, df = 3)5 | 0.253 | 0.053 | 4.735 | 0.000 |
bSpline(time, knots = knots5, df = 3)6 | -0.346 | 0.061 | -5.704 | 0.000 |
phd_year0 | -0.022 | 0.001 | -30.468 | 0.000 |
covid2020 | -0.185 | 0.020 | -9.289 | 0.000 |
covid2021 | -0.683 | 0.022 | -31.258 | 0.000 |
gender2women | -0.175 | 0.009 | -20.248 | 0.000 |
gender2no first name | -0.711 | 0.048 | -14.787 | 0.000 |
gender2missing | -0.195 | 0.092 | -2.117 | 0.034 |
ethnicityminority | -0.316 | 0.039 | -8.079 | 0.000 |
ethnicityother | -0.196 | 0.016 | -12.538 | 0.000 |
ethnicitymissing | -0.093 | 0.012 | -7.834 | 0.000 |
life_domain | -0.308 | 0.017 | -17.918 | 0.000 |
physical_domain | -0.146 | 0.015 | -9.511 | 0.000 |
social_domain | -0.356 | 0.013 | -27.205 | 0.000 |
uniLU | 0.282 | 0.035 | 8.055 | 0.000 |
uniRU | 0.614 | 0.017 | 36.988 | 0.000 |
uniRUG | 0.817 | 0.022 | 36.369 | 0.000 |
uniTUD | 0.894 | 0.068 | 13.125 | 0.000 |
uniTUE | 0.875 | 0.026 | 33.575 | 0.000 |
uniTI | 0.519 | 0.046 | 11.274 | 0.000 |
uniUM | 0.606 | 0.018 | 33.006 | 0.000 |
uniUT | 0.243 | 0.024 | 10.088 | 0.000 |
uniUU | 0.288 | 0.020 | 14.259 | 0.000 |
uniUvA | 0.577 | 0.019 | 30.198 | 0.000 |
uniVU | 0.652 | 0.021 | 31.668 | 0.000 |
uniWUR | 0.737 | 0.019 | 38.992 | 0.000 |
covid2020:gender2women | 0.004 | 0.030 | 0.148 | 0.883 |
covid2020:gender2no first name | -0.362 | 0.215 | -1.682 | 0.092 |
covid2020:gender2missing | -0.210 | 0.356 | -0.590 | 0.555 |
covid2021:gender2women | 0.028 | 0.033 | 0.842 | 0.400 |
covid2021:gender2no first name | -0.949 | 0.301 | -3.157 | 0.002 |
covid2021:gender2missing | -0.354 | 0.400 | -0.884 | 0.377 |
(Intercept) | -1.538 | 0.035 | -43.905 | 0.000 |
(Intercept) | -0.242 | 0.016 | -15.364 | 0.000 |
# Model 3: Hypo2: covid X gender X c2010
m3_r1 <- gamlss(npubs ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 + ethnicity +
life_domain + physical_domain + social_domain + uni + covid * gender2 + covid * c2010 * gender2,
data = df3, family = BNB, control = con)
fsave(m3_r1, "m3_r1")
sm3_r1 <- summary(m3_r1)
fsave(sm3_r1, "sm3_r1")
# Estimate model for two cohorts separately
table(df3$age25, useNA = "always")
df4 <- df3[df3$age25 == 1, ]
table(df4$phd_year0 + 1990, useNA = "always")
table(df4$time, useNA = "always")
knots5b <- quantile(df4$time, probs = seq(0, 1, 0.25))[2:4]
m3_r2 <- gamlss(npubs ~ bSpline(time, knots = knots5b, df = 3) + covid + gender2 + ethnicity + life_domain +
physical_domain + social_domain + uni + covid * gender2, data = df4, family = BNB, control = con)
fsave(m3_r2, "m3_r2")
sm3_r2 <- summary(m3_r2)
fsave(sm3_r2, "sm3_r2")
df5 <- df3[df3$phd_year0 < 10 & df3$phd_year0 > 1, ]
table(df5$phd_year0 + 1990, useNA = "always")
table(df5$time, useNA = "always")
knots5c <- quantile(df5$time, probs = seq(0, 1, 0.25))[2:4]
m3_r3 <- gamlss(npubs ~ bSpline(time, knots = knots5c, df = 3) + covid + gender2 + ethnicity + life_domain +
physical_domain + social_domain + uni + covid * gender2, data = df5, family = BNB, control = con)
fsave(m3_r3, "m3_r3")
sm3_r3 <- summary(m3_r3)
fsave(sm3_r3, "sm3_r3")
Different operationalization of child-rearing cohorts: PhD-cohorts after 2010
fshowdf(sm3_r1)
Estimate | Std. Error | t value | Pr(>|t|) | |
---|---|---|---|---|
(Intercept) | 1.301 | 0.025 | 52.529 | 0.000 |
bSpline(time, knots = knots5, df = 3)1 | -0.375 | 0.031 | -12.228 | 0.000 |
bSpline(time, knots = knots5, df = 3)2 | -0.221 | 0.024 | -9.232 | 0.000 |
bSpline(time, knots = knots5, df = 3)3 | -0.093 | 0.024 | -3.903 | 0.000 |
bSpline(time, knots = knots5, df = 3)4 | 0.199 | 0.036 | 5.485 | 0.000 |
bSpline(time, knots = knots5, df = 3)5 | 0.314 | 0.053 | 5.879 | 0.000 |
bSpline(time, knots = knots5, df = 3)6 | -0.389 | 0.061 | -6.406 | 0.000 |
phd_year0 | -0.014 | 0.001 | -16.005 | 0.000 |
covid | -0.391 | 0.019 | -21.047 | 0.000 |
gender2women | -0.185 | 0.010 | -19.225 | 0.000 |
gender2no first name | -0.675 | 0.050 | -13.624 | 0.000 |
gender2missing | -0.159 | 0.094 | -1.688 | 0.091 |
ethnicityminority | -0.307 | 0.039 | -7.840 | 0.000 |
ethnicityother | -0.187 | 0.016 | -11.924 | 0.000 |
ethnicitymissing | -0.090 | 0.012 | -7.549 | 0.000 |
life_domain | -0.309 | 0.017 | -17.951 | 0.000 |
physical_domain | -0.150 | 0.015 | -9.763 | 0.000 |
social_domain | -0.361 | 0.013 | -27.558 | 0.000 |
uniLU | 0.325 | 0.035 | 9.254 | 0.000 |
uniRU | 0.626 | 0.017 | 37.579 | 0.000 |
uniRUG | 0.830 | 0.023 | 36.851 | 0.000 |
uniTUD | 0.966 | 0.068 | 14.178 | 0.000 |
uniTUE | 0.879 | 0.026 | 33.715 | 0.000 |
uniTI | 0.534 | 0.046 | 11.583 | 0.000 |
uniUM | 0.611 | 0.018 | 33.220 | 0.000 |
uniUT | 0.261 | 0.024 | 10.819 | 0.000 |
uniUU | 0.315 | 0.020 | 15.502 | 0.000 |
uniUvA | 0.570 | 0.019 | 29.833 | 0.000 |
uniVU | 0.653 | 0.021 | 31.668 | 0.000 |
uniWUR | 0.748 | 0.019 | 39.406 | 0.000 |
c2010 | -0.245 | 0.018 | -13.371 | 0.000 |
covid:gender2women | 0.063 | 0.029 | 2.159 | 0.031 |
covid:gender2no first name | -0.779 | 0.196 | -3.967 | 0.000 |
covid:gender2missing | -0.370 | 0.284 | -1.305 | 0.192 |
covid:c2010 | -0.043 | 0.034 | -1.246 | 0.213 |
gender2women:c2010 | 0.041 | 0.022 | 1.915 | 0.056 |
gender2no first name:c2010 | -0.148 | 0.209 | -0.708 | 0.479 |
gender2missing:c2010 | -0.771 | 0.536 | -1.438 | 0.150 |
covid:gender2women:c2010 | -0.081 | 0.050 | -1.617 | 0.106 |
covid:gender2no first name:c2010 | 1.085 | 0.459 | 2.365 | 0.018 |
covid:gender2missing:c2010 | 0.996 | 1.078 | 0.924 | 0.356 |
(Intercept) | -1.546 | 0.035 | -43.812 | 0.000 |
(Intercept) | -0.236 | 0.016 | -15.057 | 0.000 |
For cohort 2011-2018
fshowdf(sm3_r2)
Estimate | Std. Error | t value | Pr(>|t|) | |
---|---|---|---|---|
(Intercept) | 1.254 | 0.058 | 21.695 | 0.000 |
bSpline(time, knots = knots5b, df = 3)1 | -0.419 | 0.048 | -8.735 | 0.000 |
bSpline(time, knots = knots5b, df = 3)2 | -0.293 | 0.048 | -6.159 | 0.000 |
bSpline(time, knots = knots5b, df = 3)3 | -0.572 | 0.042 | -13.480 | 0.000 |
bSpline(time, knots = knots5b, df = 3)4 | -0.511 | 0.063 | -8.104 | 0.000 |
bSpline(time, knots = knots5b, df = 3)5 | -1.065 | 0.082 | -12.982 | 0.000 |
bSpline(time, knots = knots5b, df = 3)6 | -0.814 | 0.064 | -12.695 | 0.000 |
covid | -0.291 | 0.028 | -10.555 | 0.000 |
gender2women | -0.094 | 0.017 | -5.517 | 0.000 |
gender2no first name | -0.491 | 0.180 | -2.733 | 0.006 |
gender2missing | -0.472 | 0.459 | -1.026 | 0.305 |
ethnicityminority | -0.283 | 0.060 | -4.751 | 0.000 |
ethnicityother | -0.171 | 0.025 | -6.770 | 0.000 |
ethnicitymissing | -0.125 | 0.021 | -6.006 | 0.000 |
life_domain | -0.253 | 0.030 | -8.489 | 0.000 |
physical_domain | 0.019 | 0.029 | 0.659 | 0.510 |
social_domain | 0.006 | 0.025 | 0.249 | 0.804 |
uniLU | -0.092 | 0.066 | -1.398 | 0.162 |
uniRU | 0.188 | 0.056 | 3.350 | 0.001 |
uniRUG | 0.742 | 0.079 | 9.357 | 0.000 |
uniTUD | 0.257 | 0.079 | 3.231 | 0.001 |
uniTUE | 0.758 | 0.169 | 4.472 | 0.000 |
uniTI | -0.239 | 0.085 | -2.816 | 0.005 |
uniUM | 0.127 | 0.058 | 2.193 | 0.028 |
uniUT | -0.454 | 0.066 | -6.858 | 0.000 |
uniUU | -0.062 | 0.056 | -1.104 | 0.269 |
uniUvA | 0.062 | 0.063 | 0.975 | 0.329 |
uniVU | 0.122 | 0.060 | 2.055 | 0.040 |
uniWUR | 0.148 | 0.058 | 2.539 | 0.011 |
covid:gender2women | -0.035 | 0.037 | -0.927 | 0.354 |
covid:gender2no first name | 0.191 | 0.393 | 0.486 | 0.627 |
covid:gender2missing | 0.168 | 1.041 | 0.162 | 0.871 |
(Intercept) | -1.630 | 0.054 | -29.924 | 0.000 |
(Intercept) | -1.938 | 0.083 | -23.347 | 0.000 |
non-significant negative interaction COVID-19 and women
For cohort 1992-1999
fshowdf(sm3_r3)
Estimate | Std. Error | t value | Pr(>|t|) | |
---|---|---|---|---|
(Intercept) | 1.075 | 0.038 | 28.521 | 0.000 |
bSpline(time, knots = knots5c, df = 3)1 | -0.506 | 0.060 | -8.405 | 0.000 |
bSpline(time, knots = knots5c, df = 3)2 | -0.030 | 0.042 | -0.725 | 0.469 |
bSpline(time, knots = knots5c, df = 3)3 | 0.238 | 0.045 | 5.323 | 0.000 |
bSpline(time, knots = knots5c, df = 3)4 | 0.311 | 0.047 | 6.573 | 0.000 |
bSpline(time, knots = knots5c, df = 3)5 | -0.049 | 0.063 | -0.769 | 0.442 |
bSpline(time, knots = knots5c, df = 3)6 | -0.226 | 0.075 | -3.010 | 0.003 |
covid | -0.252 | 0.029 | -8.665 | 0.000 |
gender2women | -0.164 | 0.014 | -11.547 | 0.000 |
gender2no first name | -0.430 | 0.061 | -7.009 | 0.000 |
gender2missing | 0.104 | 0.134 | 0.780 | 0.436 |
ethnicityminority | -0.140 | 0.072 | -1.956 | 0.050 |
ethnicityother | -0.026 | 0.030 | -0.857 | 0.391 |
ethnicitymissing | -0.128 | 0.022 | -5.780 | 0.000 |
life_domain | -0.013 | 0.026 | -0.478 | 0.633 |
physical_domain | -0.052 | 0.024 | -2.164 | 0.030 |
social_domain | -0.333 | 0.020 | -16.574 | 0.000 |
uniLU | 0.241 | 0.069 | 3.509 | 0.000 |
uniRU | 0.581 | 0.024 | 24.131 | 0.000 |
uniRUG | 0.896 | 0.029 | 30.832 | 0.000 |
uniTUE | 0.621 | 0.036 | 17.058 | 0.000 |
uniTI | 0.935 | 0.086 | 10.926 | 0.000 |
uniUM | 0.597 | 0.028 | 21.649 | 0.000 |
uniUT | 0.358 | 0.037 | 9.791 | 0.000 |
uniUU | 0.178 | 0.060 | 2.960 | 0.003 |
uniUvA | 0.518 | 0.028 | 18.255 | 0.000 |
uniVU | 0.728 | 0.033 | 21.989 | 0.000 |
uniWUR | 0.759 | 0.028 | 27.261 | 0.000 |
covid:gender2women | 0.090 | 0.052 | 1.733 | 0.083 |
covid:gender2no first name | -0.722 | 0.295 | -2.449 | 0.014 |
covid:gender2missing | -0.740 | 0.725 | -1.020 | 0.308 |
(Intercept) | -1.446 | 0.056 | -25.919 | 0.000 |
(Intercept) | -2.751 | 0.074 | -36.972 | 0.000 |
non-significant negative (or even positive) interaction COVID-19 and women
m2_bnby2 <- gamlss(npubs_a ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 + ethnicity +
life_domain + physical_domain + social_domain + uni + covid * gender2, data = df3, family = BNB,
control = con)
fsave(m2_bnby2, "m2_bnby2")
sm2_bnby2 <- summary(m2_bnby2)
fsave(sm2_bnby2, "sm2_bnby2")
m2_bnby3 <- gamlss(npubs_first_a ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 +
ethnicity + life_domain + physical_domain + social_domain + uni + covid * gender2, data = df3, family = BNB,
control = con)
fsave(m2_bnby3, "m2_bnby3")
sm2_bnby3 <- summary(m2_bnby3)
fsave(sm2_bnby3, "sm2_bnby3")
m2_bnby4 <- gamlss(npubs_last_a ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 +
ethnicity + life_domain + physical_domain + social_domain + uni + covid * gender2, data = df3, family = BNB,
control = con)
fsave(m2_bnby4, "m2_bnby4")
sm2_bnby4 <- summary(m2_bnby4)
fsave(sm2_bnby4, "sm2_bnby4")
m2_bnby5 <- gamlss(npubs_mid_a ~ bSpline(time, knots = knots5, df = 3) + phd_year0 + covid + gender2 +
ethnicity + life_domain + physical_domain + social_domain + uni + covid * gender2, data = df3, family = BNB,
control = con)
fsave(m2_bnby5, "m2_bnby5")
sm2_bnby5 <- summary(m2_bnby5)
fsave(sm2_bnby5, "sm2_bnby5")
Please note, because of different sample sizes, reporting the AIC does not make sense!
rs1 <- NA #Efron's R-squared
rs2 <- NA # Nagelkerke R-squared
rs1[1] <- efronsquared(actual = m2$y, predicted = predict(m2, type = "response"))
rs1[2] <- efronsquared(actual = m2_bnby2$y, predicted = predict(m2_bnby2, type = "response"))
rs1[3] <- efronsquared(actual = m2_bnby3$y, predicted = predict(m2_bnby3, type = "response"))
rs1[4] <- efronsquared(actual = m2_bnby5$y, predicted = predict(m2_bnby5, type = "response"))
rs1[5] <- efronsquared(actual = m2_bnby4$y, predicted = predict(m2_bnby4, type = "response"))
rs1
rs2[1] <- Rsq(m2, "Cragg Uhler")
rs2[2] <- Rsq(m2_bnby2, "Cragg Uhler")
rs2[3] <- Rsq(m2_bnby3, "Cragg Uhler")
rs2[4] <- Rsq(m2_bnby5, "Cragg Uhler")
rs2[5] <- Rsq(m2_bnby4, "Cragg Uhler")
rs2
# see here: https://stats.oarc.ucla.edu/other/mult-pkg/faq/general/faq-what-are-pseudo-r-squareds/
rs3_tot <- AIC(m2, m2_bnby2, m2_bnby3, m2_bnby5, m2_bnby4)
rs3 <- NA
rs3[1] <- paste(as.character(round(rs3_tot$AIC[5])), " (df=", as.character(rs3_tot$df[5]), ")", sep = "")
rs3[2] <- paste(as.character(round(rs3_tot$AIC[4])), " (df=", as.character(rs3_tot$df[4]), ")", sep = "")
rs3[3] <- paste(as.character(round(rs3_tot$AIC[3])), " (df=", as.character(rs3_tot$df[3]), ")", sep = "")
rs3[4] <- paste(as.character(round(rs3_tot$AIC[2])), " (df=", as.character(rs3_tot$df[2]), ")", sep = "")
rs3[5] <- paste(as.character(round(rs3_tot$AIC[1])), " (df=", as.character(rs3_tot$df[1]), ")", sep = "")
df_fitst3 <- data.frame(rs1 = rs1, rs2 = rs2, rs3 = rs3)
# fsave(df_fitst3)
r1 <- as.data.frame(sm2_bnb)[, c(1, 2, 4)]
r2 <- as.data.frame(sm2_bnby2)[, c(1, 2, 4)]
r3 <- as.data.frame(sm2_bnby3)[, c(1, 2, 4)]
r4 <- as.data.frame(sm2_bnby4)[, c(1, 2, 4)]
r5 <- as.data.frame(sm2_bnby5)[, c(1, 2, 4)]
res <- cbind(r1, r2, r3, r5, r4)
# fsave(res, 'Table3_raw')
Table3_raw <- res
Table3_raw <- fload("./data/processed/Table3_raw_20250603.rda")
df_fits3 <- fload("./data/processed/df_fitst3_20250603.rda")
Table3_raw <- Table3_raw[c(1, 9,10,31),]
rownames(Table3_raw) <- c("intercept", "Covid-years", "gender: women", "Covid-years*women")
Table3 <- cbind(rownames(Table3_raw), Table3_raw)
colnames(Table3) <- as.character(1:16)
table3ft <- flextable(Table3) %>% add_header_row(values=c(" ", rep(c("B", "S.E.", "P"), 5)), top=FALSE) %>% delete_rows(i=1,part="header") %>%
#set_caption( "Predicting yearly publication output per year (Negative Beta Binomial)") %>%
add_footer_lines(value = c("Notes: \nFor reasons of parsimony, the estimates of the following variables are not shown: bsplines; gender: no first name; gender: missing; ethnicity; domain; university. Similarly, the estimated shape parameters (sigma and nu) are not shown. \n N_person-years = 113,782; N_persons = 8,289")) %>%
add_header_row(values = c(" ", "all output", "all articles", "1st authored articles", "mid position authored articles", "last authored articles"), colwidths = c(1, 3, 3,3,3,3)) %>%
align(i = 1, align = "center", part = "header") %>%
align(i = 2, align = "center", part = "header") %>%
colformat_double(digits = 3) %>%
fontsize(size = 8, part = "all" ) %>%
set_table_properties(opts_pdf = list(arraystretch = 1)) %>% #to adjust row height
width(j = 1, width = 1.3) %>%
width(j = 2:16 , width = .4)
table3ft <- add_body_row(table3ft,
values = c("Efron's R-squared",round(df_fitst3$rs1,3)),
colwidths = c(1,3, 3, 3, 3, 3), top = FALSE
) %>%
align(i = 5, j=c(2:16), align = "center", part = "body")
table3ft
m2_bnby2 <- fload("./data/processed/m2_bnby2_20240813.rda")
df_c0 <- df3
df_c0$covid <- 0
df_c1 <- df3
df_c1$covid <- 1
df_c0m <- df_c0
df_c0m$gender2 <- factor("men", levels = c("men", "women", "no first name", "missing"))
levels(df_c0m$gender2) <- levels(df3$gender2)
df_c0w <- df_c0
df_c0w$gender2 <- factor("women", levels = c("men", "women", "no first name", "missing"))
df_c1m <- df_c1
df_c1m$gender2 <- factor("men", levels = c("men", "women", "no first name", "missing"))
df_c1w <- df_c1
df_c1w$gender2 <- factor("women", levels = c("men", "women", "no first name", "missing"))
c0m <- predict(m2_bnby2, newdata = df_c0m, type = "response")
c0w <- predict(m2_bnby2, newdata = df_c0w, type = "response")
c1m <- predict(m2_bnby2, newdata = df_c1m, type = "response")
c1w <- predict(m2_bnby2, newdata = df_c1w, type = "response")
mean(c0m)
mean(c0w)
mean(c1m)
mean(c1w)
mean(c0w - c0m)
mean(c1w - c1m)
mean(c1w - c1m - (c0w - c0m))
#> [1] 3.114305
#> [1] 2.574829
#> [1] 2.124099
#> [1] 1.768505
#> [1] -0.539476
#> [1] -0.3555939
#> [1] 0.1838821
Copyright © 2024- Jochem Tolsma