Skip to content

Commit

Permalink
Apply automatic stylistic changes
Browse files Browse the repository at this point in the history
  • Loading branch information
github-actions[bot] committed Feb 16, 2024
1 parent 5063c04 commit 8abc862
Showing 1 changed file with 24 additions and 28 deletions.
52 changes: 24 additions & 28 deletions R/jsBasicGadget.R
Original file line number Diff line number Diff line change
Expand Up @@ -278,27 +278,26 @@ jsBasicGadget <- function(data, nfactor.limit = 20) {
title = "subgroup cox",
sidebarLayout(
sidebarPanel(
forestcoxUI('Forest')
forestcoxUI("Forest")
),
mainPanel(
withLoader(
DTOutput('tablesub'),
DTOutput("tablesub"),
type = "html",
loader = "loader6"
)

)
)
),
tabPanel(
title = "subgroup regression",
sidebarLayout(
sidebarPanel(
forestglmUI('Forest_glm')
forestglmUI("Forest_glm")
),
mainPanel(
withLoader(
DTOutput('tablesub_glm'),
DTOutput("tablesub_glm"),
type = "html",
loader = "loader6"
)
Expand All @@ -309,15 +308,14 @@ jsBasicGadget <- function(data, nfactor.limit = 20) {
title = "subgroup logistic regression",
sidebarLayout(
sidebarPanel(
forestglmUI('Forest_glmbi')
forestglmUI("Forest_glmbi")
),
mainPanel(
withLoader(
DTOutput('tablesub_glmbi'),
DTOutput("tablesub_glmbi"),
type = "html",
loader = "loader6"
)

)
)
)
Expand Down Expand Up @@ -706,17 +704,17 @@ jsBasicGadget <- function(data, nfactor.limit = 20) {
caption.placement = "top"
)

outtable<-forestcoxServer('Forest',data=data,data_label=data.label)
output$tablesub<-renderDT({
outtable <- forestcoxServer("Forest", data = data, data_label = data.label)
output$tablesub <- renderDT({
outtable()
})
outtable_glm<-forestglmServer('Forest_glm',data=data,data_label=data.label,family='gaussian')
output$tablesub_glm<-renderDT({
outtable_glm <- forestglmServer("Forest_glm", data = data, data_label = data.label, family = "gaussian")
output$tablesub_glm <- renderDT({
outtable_glm()
})

outtable_glmbi<-forestglmServer('Forest_glmbi',data=data,data_label=data.label,family='binomial')
output$tablesub_glmbi<-renderDT({
outtable_glmbi <- forestglmServer("Forest_glmbi", data = data, data_label = data.label, family = "binomial")
output$tablesub_glmbi <- renderDT({
outtable_glmbi()
})
session$onSessionEnded(function() {
Expand Down Expand Up @@ -1072,27 +1070,26 @@ jsBasicExtAddin <- function(nfactor.limit = 20, max.filesize = 2048) {
title = "subgroup cox",
sidebarLayout(
sidebarPanel(
forestcoxUI('Forest')
forestcoxUI("Forest")
),
mainPanel(
withLoader(
DTOutput('tablesub'),
DTOutput("tablesub"),
type = "html",
loader = "loader6"
)

)
)
),
tabPanel(
title = "subgroup regression",
sidebarLayout(
sidebarPanel(
forestglmUI('Forest_glm')
forestglmUI("Forest_glm")
),
mainPanel(
withLoader(
DTOutput('tablesub_glm'),
DTOutput("tablesub_glm"),
type = "html",
loader = "loader6"
)
Expand All @@ -1103,15 +1100,14 @@ jsBasicExtAddin <- function(nfactor.limit = 20, max.filesize = 2048) {
title = "subgroup logistic regression",
sidebarLayout(
sidebarPanel(
forestglmUI('Forest_glmbi')
forestglmUI("Forest_glmbi")
),
mainPanel(
withLoader(
DTOutput('tablesub_glmbi'),
DTOutput("tablesub_glmbi"),
type = "html",
loader = "loader6"
)

)
)
)
Expand Down Expand Up @@ -1350,17 +1346,17 @@ jsBasicExtAddin <- function(nfactor.limit = 20, max.filesize = 2048) {
caption = "Best cutoff",
caption.placement = "top"
)
outtable<-forestcoxServer('Forest',data=data,data_label=data.label)
output$tablesub<-renderDT({
outtable <- forestcoxServer("Forest", data = data, data_label = data.label)
output$tablesub <- renderDT({
outtable()
})
outtable_glm<-forestglmServer('Forest_glm',data=data,data_label=data.label,family='gaussian')
output$tablesub_glm<-renderDT({
outtable_glm <- forestglmServer("Forest_glm", data = data, data_label = data.label, family = "gaussian")
output$tablesub_glm <- renderDT({
outtable_glm()
})

outtable_glmbi<-forestglmServer('Forest_glmbi',data=data,data_label=data.label,family='binomial')
output$tablesub_glmbi<-renderDT({
outtable_glmbi <- forestglmServer("Forest_glmbi", data = data, data_label = data.label, family = "binomial")
output$tablesub_glmbi <- renderDT({
outtable_glmbi()
})
session$onSessionEnded(function() {
Expand Down

0 comments on commit 8abc862

Please sign in to comment.