Home
last modified time | relevance | path

Searched refs:roc (Results 1 – 25 of 2812) sorted by relevance

12345678910>>...113

/dports/graphics/R-cran-pROC/pROC/R/
H A Dbootstrap.R344 roc$response <- c(rep(roc$levels[1], length(controls)), rep(roc$levels[2], length(cases)))
348 smooth.roc.call$roc <- roc
378 smooth.roc.call$roc <- roc
487 roc$response <- c(rep(roc$levels[1], length(controls)), rep(roc$levels[2], length(cases)))
491 smooth.roc.call$roc <- roc
519 smooth.roc.call$roc <- roc
573 roc$response <- c(rep(roc$levels[1], length(controls)), rep(roc$levels[2], length(cases)))
577 smooth.roc.call$roc <- roc
605 smooth.roc.call$roc <- roc
716 smooth.roc.call$roc <- roc
[all …]
H A Dcoords.R186 roc <- sort(roc)
200 … se <- roc$sensitivities[roc$sensitivities <= partial.auc[1] & roc$sensitivities >= partial.auc[2]]
201 … sp <- roc$specificities[roc$sensitivities <= partial.auc[1] & roc$sensitivities >= partial.auc[2]]
202 … thres <- roc$thresholds[roc$sensitivities <= partial.auc[1] & roc$sensitivities >= partial.auc[2]]
205 … se <- roc$sensitivities[roc$specificities <= partial.auc[1] & roc$specificities >= partial.auc[2]]
206 … sp <- roc$specificities[roc$specificities <= partial.auc[1] & roc$specificities >= partial.auc[2]]
207 … thres <- roc$thresholds[roc$specificities <= partial.auc[1] & roc$specificities >= partial.auc[2]]
229 … se <- roc$sensitivities[roc$sensitivities <= partial.auc[1] & roc$sensitivities >= partial.auc[2]]
230 … sp <- roc$specificities[roc$sensitivities <= partial.auc[1] & roc$sensitivities >= partial.auc[2]]
231 … thres <- roc$thresholds[roc$sensitivities <= partial.auc[1] & roc$sensitivities >= partial.auc[2]]
[all …]
H A Dvar.R29 roc <- auc functionVar
31 roc <- attr(roc, "roc")
32 roc$auc <- auc
34 var.roc(roc, ...)
41 var.roc <- function(roc, argument
51 roc$auc <- auc(roc, ...)
58 percent <- roc$percent
60 roc <- roc.utils.unpercent(roc)
102 m <- length(roc$cases)
107 var <- var.roc.obuchowski(roc) / length(roc$cases)
[all …]
H A Dsmooth.R28 roc <- attr(smooth.roc, "roc") functionVar
29 if (is.null(roc))
31 smooth.roc(roc, ...)
101 args$roc <- NULL
107 args$roc <- NULL
118 percent = roc$percent, direction = roc$direction,
121 predictor <- c(roc$controls, roc$cases)
165 …df <- data.frame(sp=qnorm(roc$sp * ifelse(roc$percent, 1/100, 1)), se=qnorm(roc$se * ifelse(roc$pe…
207 x <- seq(min(c(roc$controls, roc$cases)), max(c(roc$controls, roc$cases)), length.out=n)
239 logcondens <- logcondens::logConROC(roc$cases, roc$controls, sp)
[all …]
H A Dci.auc.R43 return(ci.auc(roc = roc, ...))
48 roc <- attr(auc, "roc") functionVar
49 roc$auc <- auc
78 roc <- attr(smooth.roc, "roc") functionVar
84 roc$percent <- FALSE
129 ci.auc.roc <- function(roc, argument
148 roc$auc <- auc(roc, ...)
151 percent <- roc$percent
152 oldauc <- roc$auc
154 roc <- roc.utils.unpercent(roc)
[all …]
/dports/graphics/R-cran-pROC/pROC/
H A DNAMESPACE7 S3method("auc", "roc")
15 S3method("ci", "roc")
76 S3method("power.roc.test", "roc")
93 export(roc)
100 export(roc.test)
101 S3method("roc.test", "roc")
102 S3method("roc.test", "smooth.roc")
132 S3method("lines.roc", "roc")
133 S3method("lines.roc", "smooth.roc")
144 S3method("plot.roc", "roc")
[all …]
/dports/devel/py-numba/numba-0.51.2/numba/roc/tests/hsapy/
H A Dtest_scan.py20 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
29 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
31 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
40 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
51 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
114 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
118 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
123 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
128 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
133 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
[all …]
H A Dtest_atomics.py4 from numba import roc
9 tid = roc.get_local_id(0)
12 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
14 roc.atomic.add(sm, bin, 1)
15 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
20 tx = roc.get_local_id(0)
21 ty = roc.get_local_id(1)
24 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
26 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
35 roc.barrier(roc.CLK_GLOBAL_MEM_FENCE)
[all …]
/dports/graphics/R-cran-pROC/pROC/man/
H A Dlines.roc.Rd2 \name{lines.roc}
3 \alias{lines.roc}
4 \alias{lines.roc.roc}
6 \alias{lines.roc.smooth.roc}
19 \S3method{lines.roc}{roc}(x, lwd=2, ...)
22 \S3method{lines.roc}{smooth.roc}(x, ...)
27 \item{x}{a roc object from the \link{roc} function (for plot.roc.roc),
47 \code{\link{roc}}, \code{\link{plot.roc}}
53 roc.s100b <- roc(aSAH$outcome, aSAH$s100b)
54 roc.wfns <- roc(aSAH$outcome, aSAH$wfns)
[all …]
/dports/multimedia/libv4l/linux-5.13-rc2/net/mac80211/
H A Doffchannel.c174 roc->frame->data, roc->frame->len, in ieee80211_roc_notify_destroy()
176 ieee80211_free_txskb(&roc->sdata->local->hw, roc->frame); in ieee80211_roc_notify_destroy()
181 roc->cookie, roc->chan, in ieee80211_roc_notify_destroy()
189 kfree(roc); in ieee80211_roc_notify_destroy()
214 if (roc->abort || roc->hw_begun || remaining <= 0) in ieee80211_end_finished_rocs()
246 ieee80211_tx_skb_tid_band(roc->sdata, roc->frame, 7, in ieee80211_handle_roc_started()
252 roc->chan, roc->req_duration, in ieee80211_handle_roc_started()
314 if (tmp->sdata != roc->sdata || tmp->chan != roc->chan) in _ieee80211_start_next_roc()
425 if (!roc) in __ieee80211_roc_work()
547 roc = kzalloc(sizeof(*roc), GFP_KERNEL); in ieee80211_start_roc_work()
[all …]
/dports/multimedia/v4l_compat/linux-5.13-rc2/net/mac80211/
H A Doffchannel.c174 roc->frame->data, roc->frame->len, in ieee80211_roc_notify_destroy()
176 ieee80211_free_txskb(&roc->sdata->local->hw, roc->frame); in ieee80211_roc_notify_destroy()
181 roc->cookie, roc->chan, in ieee80211_roc_notify_destroy()
189 kfree(roc); in ieee80211_roc_notify_destroy()
214 if (roc->abort || roc->hw_begun || remaining <= 0) in ieee80211_end_finished_rocs()
246 ieee80211_tx_skb_tid_band(roc->sdata, roc->frame, 7, in ieee80211_handle_roc_started()
252 roc->chan, roc->req_duration, in ieee80211_handle_roc_started()
314 if (tmp->sdata != roc->sdata || tmp->chan != roc->chan) in _ieee80211_start_next_roc()
425 if (!roc) in __ieee80211_roc_work()
547 roc = kzalloc(sizeof(*roc), GFP_KERNEL); in ieee80211_start_roc_work()
[all …]
/dports/multimedia/v4l-utils/linux-5.13-rc2/net/mac80211/
H A Doffchannel.c174 roc->frame->data, roc->frame->len, in ieee80211_roc_notify_destroy()
176 ieee80211_free_txskb(&roc->sdata->local->hw, roc->frame); in ieee80211_roc_notify_destroy()
181 roc->cookie, roc->chan, in ieee80211_roc_notify_destroy()
189 kfree(roc); in ieee80211_roc_notify_destroy()
214 if (roc->abort || roc->hw_begun || remaining <= 0) in ieee80211_end_finished_rocs()
246 ieee80211_tx_skb_tid_band(roc->sdata, roc->frame, 7, in ieee80211_handle_roc_started()
252 roc->chan, roc->req_duration, in ieee80211_handle_roc_started()
314 if (tmp->sdata != roc->sdata || tmp->chan != roc->chan) in _ieee80211_start_next_roc()
425 if (!roc) in __ieee80211_roc_work()
547 roc = kzalloc(sizeof(*roc), GFP_KERNEL); in ieee80211_start_roc_work()
[all …]
/dports/graphics/R-cran-pROC/pROC/tests/testthat/
H A Dtest-are-paired.R13 …expect_true(are.paired(roc(aSAH.missing$outcome, aSAH.missing$wfns), roc(aSAH.missing$outcome, aSA…
18 …expect_false(are.paired(roc(aSAH$outcome[21:113], aSAH$wfns[21:113]), roc(aSAH$outcome, aSAH$ndka)…
25 r.wfns.f <- roc(outcome ~ wfns, aSAH)
26 r.ndka.f <- roc(outcome ~ ndka, aSAH)
33 expect_true(are.paired(roc(outcome ~ wfns, aSAH.missing), roc(outcome ~ ndka, aSAH.missing)))
41 …expect_false(are.paired(roc(outcome ~ wfns, aSAH, levels = c("Good", "Poor")), roc(outcome ~ ndka,…
61 r1 <- roc(aSAH.missing$outcome, aSAH.missing$ndka)
79 …expect_true(are.paired(smooth(roc(aSAH.missing$outcome, aSAH.missing$wfns)), smooth(roc(aSAH.missi…
84 …expect_false(are.paired(smooth(roc(aSAH$outcome[21:113], aSAH$wfns[21:113])), smooth(roc(aSAH$outc…
93 expect_true(are.paired(roc(aSAH$outcome, aSAH$wfns), smooth(roc(aSAH$outcome, aSAH$ndka))))
[all …]
H A Dtest-roc.R176 roc(outcome ~ wfns)[roc.check.only.items],
177 roc(outcome, wfns)[roc.check.only.items]
197 expect_error(roc(~ndka, data=aSAH))
299 r <- roc(aSAH, outcome, s100b, ret="roc")
301 co <- roc(aSAH, outcome, s100b, ret="coords")
303 co <- roc(aSAH, outcome, s100b, ret="all_coords")
309 r <- roc(aSAH, "outcome", "s100b", ret="roc")
311 co <- roc(aSAH, "outcome", "s100b", ret="coords")
335 expect_error(roc(aSAH, outcome, s100c), "Column")
372 r <- roc(aSAH$outcome, wfns2)
[all …]
/dports/math/pspp/pspp-1.4.1/src/language/stats/
H A Droc.c85 roc.n_vars = 0; in cmd_roc()
91 roc.ci = 95; in cmd_roc()
94 roc.pos = roc.pos_weighted = 0; in cmd_roc()
95 roc.neg = roc.neg_weighted = 0; in cmd_roc()
121 roc.state_var_width = var_get_width (roc.state_var); in cmd_roc()
122 value_init (&roc.state_value, roc.state_var_width); in cmd_roc()
123 parse_value (lexer, &roc.state_value, roc.state_var); in cmd_roc()
293 value_destroy (&roc.state_value, roc.state_var_width); in cmd_roc()
299 value_destroy (&roc.state_value, roc.state_var_width); in cmd_roc()
728 roc->vars, roc->n_vars, in do_roc()
[all …]
/dports/java/openjdk8/jdk8u-jdk8u312-b07.1/hotspot/src/cpu/ppc/vm/
H A Dassembler_ppc.cpp106 if (roc.is_constant()) { in ld()
125 if (roc.is_constant()) { in lwa()
144 if (roc.is_constant()) { in lwz()
163 if (roc.is_constant()) { in lha()
182 if (roc.is_constant()) { in lhz()
201 if (roc.is_constant()) { in lbz()
220 if (roc.is_constant()) { in std()
241 if (roc.is_constant()) { in stw()
262 if (roc.is_constant()) { in sth()
283 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk8-jre/jdk8u-jdk8u312-b07.1/hotspot/src/cpu/ppc/vm/
H A Dassembler_ppc.cpp106 if (roc.is_constant()) { in ld()
125 if (roc.is_constant()) { in lwa()
144 if (roc.is_constant()) { in lwz()
163 if (roc.is_constant()) { in lha()
182 if (roc.is_constant()) { in lhz()
201 if (roc.is_constant()) { in lbz()
220 if (roc.is_constant()) { in std()
241 if (roc.is_constant()) { in stw()
262 if (roc.is_constant()) { in sth()
283 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk11/jdk11u-jdk-11.0.13-8-1/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp98 if (roc.is_constant()) { in ld()
117 if (roc.is_constant()) { in lwa()
136 if (roc.is_constant()) { in lwz()
155 if (roc.is_constant()) { in lha()
174 if (roc.is_constant()) { in lhz()
193 if (roc.is_constant()) { in lbz()
212 if (roc.is_constant()) { in std()
233 if (roc.is_constant()) { in stw()
254 if (roc.is_constant()) { in sth()
275 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk13/jdk13u-jdk-13.0.10-1-1/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp98 if (roc.is_constant()) { in ld()
117 if (roc.is_constant()) { in lwa()
136 if (roc.is_constant()) { in lwz()
155 if (roc.is_constant()) { in lha()
174 if (roc.is_constant()) { in lhz()
193 if (roc.is_constant()) { in lbz()
212 if (roc.is_constant()) { in std()
233 if (roc.is_constant()) { in stw()
254 if (roc.is_constant()) { in sth()
275 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk12/openjdk-jdk12u-jdk-12.0.2-10-4/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp98 if (roc.is_constant()) { in ld()
117 if (roc.is_constant()) { in lwa()
136 if (roc.is_constant()) { in lwz()
155 if (roc.is_constant()) { in lha()
174 if (roc.is_constant()) { in lhz()
193 if (roc.is_constant()) { in lbz()
212 if (roc.is_constant()) { in std()
233 if (roc.is_constant()) { in stw()
254 if (roc.is_constant()) { in sth()
275 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk16/jdk16u-jdk-16.0.2-7-1/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp99 if (roc.is_constant()) { in ld()
118 if (roc.is_constant()) { in lwa()
137 if (roc.is_constant()) { in lwz()
156 if (roc.is_constant()) { in lha()
175 if (roc.is_constant()) { in lhz()
194 if (roc.is_constant()) { in lbz()
213 if (roc.is_constant()) { in std()
234 if (roc.is_constant()) { in stw()
255 if (roc.is_constant()) { in sth()
276 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk17/jdk17u-jdk-17.0.1-12-1/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp99 if (roc.is_constant()) { in ld()
118 if (roc.is_constant()) { in lwa()
137 if (roc.is_constant()) { in lwz()
156 if (roc.is_constant()) { in lha()
175 if (roc.is_constant()) { in lhz()
194 if (roc.is_constant()) { in lbz()
213 if (roc.is_constant()) { in std()
234 if (roc.is_constant()) { in stw()
255 if (roc.is_constant()) { in sth()
276 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk11-jre/jdk11u-jdk-11.0.13-8-1/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp98 if (roc.is_constant()) { in ld()
117 if (roc.is_constant()) { in lwa()
136 if (roc.is_constant()) { in lwz()
155 if (roc.is_constant()) { in lha()
174 if (roc.is_constant()) { in lhz()
193 if (roc.is_constant()) { in lbz()
212 if (roc.is_constant()) { in std()
233 if (roc.is_constant()) { in stw()
254 if (roc.is_constant()) { in sth()
275 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk15/jdk15u-jdk-15.0.6-1-1/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp99 if (roc.is_constant()) { in ld()
118 if (roc.is_constant()) { in lwa()
137 if (roc.is_constant()) { in lwz()
156 if (roc.is_constant()) { in lha()
175 if (roc.is_constant()) { in lhz()
194 if (roc.is_constant()) { in lbz()
213 if (roc.is_constant()) { in std()
234 if (roc.is_constant()) { in stw()
255 if (roc.is_constant()) { in sth()
276 if (roc.is_constant()) { in stb()
[all …]
/dports/java/openjdk14/jdk14u-jdk-14.0.2-12-1/src/hotspot/cpu/ppc/
H A Dassembler_ppc.cpp98 if (roc.is_constant()) { in ld()
117 if (roc.is_constant()) { in lwa()
136 if (roc.is_constant()) { in lwz()
155 if (roc.is_constant()) { in lha()
174 if (roc.is_constant()) { in lhz()
193 if (roc.is_constant()) { in lbz()
212 if (roc.is_constant()) { in std()
233 if (roc.is_constant()) { in stw()
254 if (roc.is_constant()) { in sth()
275 if (roc.is_constant()) { in stb()
[all …]

12345678910>>...113