Skip to content

Commit 3419e2f

Browse files
committed
Save known tags in a json file
1 parent bc226a3 commit 3419e2f

File tree

2 files changed

+4
-0
lines changed

2 files changed

+4
-0
lines changed

scripts/generate_known_tags.R

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -71,6 +71,9 @@ setdiff(svg_tags, cran_tags)
7171
# combine old and new tags so that old tags are not lost
7272
save_tags <- c(new_tags, cran_tags) %>% unique() %>% sort()
7373

74+
# Save a JSON version so other languages can read them in easily
75+
cat(jsonlite::toJSON(save_tags), file = "scripts/known_tags.json")
76+
7477
save_line <- paste0(
7578
format(paste0(" \"", save_tags, "\"", ifelse(seq_along(save_tags) == length(save_tags), "", ",")), justify = "left"), "#",
7679
ifelse(save_tags %in% html_tags, " html", " "),

scripts/known_tags.json

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -0,0 +1 @@
1+
["a","abbr","acronym","address","animate","animateMotion","animateTransform","applet","area","article","aside","audio","b","base","basefont","bdi","bdo","bgsound","big","blink","blockquote","body","br","button","canvas","caption","center","circle","cite","clipPath","code","col","colgroup","color-profile","command","content","data","datalist","dd","defs","del","desc","details","dfn","dialog","dir","discard","div","dl","dt","ellipse","em","embed","eventsource","feBlend","feColorMatrix","feComponentTransfer","feComposite","feConvolveMatrix","feDiffuseLighting","feDisplacementMap","feDistantLight","feDropShadow","feFlood","feFuncA","feFuncB","feFuncG","feFuncR","feGaussianBlur","feImage","feMerge","feMergeNode","feMorphology","feOffset","fePointLight","feSpecularLighting","feSpotLight","feTile","feTurbulence","fieldset","figcaption","figure","filter","font","footer","foreignObject","form","frame","frameset","g","h1","h2","h3","h4","h5","h6","hatch","hatchpath","head","header","hgroup","hr","html","i","iframe","image","img","input","ins","kbd","keygen","label","legend","li","line","linearGradient","link","main","map","mark","marker","marquee","mask","menu","menuitem","mesh","meshgradient","meshpatch","meshrow","meta","metadata","meter","mpath","nav","nobr","noembed","noframes","noscript","object","ol","optgroup","option","output","p","param","path","pattern","picture","plaintext","polygon","polyline","portal","pre","progress","q","radialGradient","rb","rect","rp","rt","rtc","ruby","s","samp","script","section","select","set","shadow","slot","small","solidcolor","source","spacer","span","stop","strike","strong","style","sub","summary","sup","svg","switch","symbol","table","tbody","td","template","text","textarea","textPath","tfoot","th","thead","time","title","tr","track","tspan","tt","u","ul","unknown","use","var","video","view","wbr","xmp"]

0 commit comments

Comments
 (0)