Skip to content

Commit f171c8f

Browse files
committed
Remove unnecessary check after match.arg
1 parent 4605713 commit f171c8f

File tree

1 file changed

+0
-1
lines changed

1 file changed

+0
-1
lines changed

R/article.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -198,7 +198,6 @@ ims_article <- function(journal = c("aoas", "aap", "aop", "aos", "sts"),
198198
), pandoc_args = NULL, ...) {
199199

200200
journal <- match.arg(journal)
201-
if (length(journal) > 1) stop("Please choose just one ", dQuote("journal"))
202201

203202
with_kwsc <- journal %in% c("aap", "aop", "aos") # with keyword_subclass
204203

0 commit comments

Comments
 (0)