#' mercados UI Function
#'
#' @description Modulo de mercados.
#'
#' @param id,input,output,session Internal parameters for {shiny}.
#'
#' @noRd
#'
#' @importFrom shiny NS tagList
mod_conj_mercados_ui <- function(id) {
ns <- NS(id)
tagList(
fluidPage(titlePanel(h1("MERCADO DE TRABALHO, CÂMBIO E JUROS")),
fluidRow(
# Resenha
box(
closable = FALSE,
width = 12,
status = NULL,
background = "yellow",
solidHeader = TRUE,
tags$div(
class = "res-body",
HTML(tail(resenhas_conjuntura$mercados, 1))
)
),
#Relatorios
box(
title = tags$div("Relatórios", class = "box-tit"),
closable = FALSE,
collapsible = TRUE,
collapsed = FALSE,
width = 12,
status = "warning",
background = "yellow",
solidHeader = TRUE,
enable_dropdown = FALSE,
mainPanel(
tabsetPanel(
tabPanel("2021", tags$a("Novembro", href="www/relatorios/mercados/2021/11/mercados.pdf", target="_blank"))
)
)
),
# Mercado de Trabalho
box(
title = tags$div("Mercado de Trabalho", class = "box-tit"),
closable = FALSE,
width = 4,
height = 700,
status = "warning",
solidHeader = TRUE,
collapsible = FALSE,
enable_dropdown = FALSE,
tags$div("Taxa de desemprego", class = "box-subtit"),
tags$div("Percentual da população economicamente ativa, mensal", class = "box-body"),
withSpinner(plotlyOutput(ns("plot3")), type = 1, color = "#004b8d", size = 1.5),
tags$div("Fonte: IBGE", class = "box-legenda"),
tags$div(
HTML(
ifelse(
is.na(tail(legenda_conjuntura$merc.trab, 1)),
"",
tail(legenda_conjuntura$merc.trab, 1)
)
),
class = "box-body"
),
footer = fluidRow(
column(
width = 12,
descriptionBlock(
number = paste(round(
tail(series$Desemprego$value, 1) - head(tail(series$Desemprego$value, 2), 1), 2
), "%"),
numberColor = if (tail(series$Desemprego$value, 1) - head(tail(series$Desemprego$value, 2), 1) >= 0) {
"danger"
} else {
"success"
},
numberIcon = if (tail(series$Desemprego$value, 1) - head(tail(series$Desemprego$value, 2), 1) >= 0) {
icon("fas fa-caret-up")
} else {
icon("fas fa-caret-down")
},
header = paste0(tail(series$Desemprego$value, 1), "%", " (", tail(months(series$Desemprego$date), 1), ")"),
text = "Desemprego",
rightBorder = FALSE,
marginBottom = FALSE
)
)
)
),
# Emprego ES
box(
title = tags$div("Mercado de Trabalho ES", class = "box-tit"),
closable = FALSE,
width = 4,
height = 700,
status = "warning",
solidHeader = TRUE,
collapsible = FALSE,
enable_dropdown = FALSE,
tags$div("Geração de emprego", class = "box-subtit"),
tags$div("Unidades, empregos formais, mensal", class = "box-body"),
tags$div(
HTML(
ifelse(
is.na(tail(legenda_conjuntura$emprego.es, 1)),
"",
tail(legenda_conjuntura$emprego.es, 1)
)
),
class = "box-body"
),
withSpinner(plotlyOutput(ns("plot4")), type = 1, color = "#004b8d", size = 1.5),
tags$div("Fonte: MTE", class = "box-legenda"),
footer = fluidRow(
column(
width = 12,
descriptionBlock(
number = paste(round(
tail(series$EmpregoGES$value, 1) - head(tail(series$EmpregoGES$value, 2), 1), 2
), "unidades"),
numberColor = if (tail(series$EmpregoGES$value, 1) - head(tail(series$EmpregoGES$value, 2), 1) >= 0) {
"success"
} else {
"danger"
},
numberIcon = if (tail(series$EmpregoGES$value, 1) - head(tail(series$EmpregoGES$value, 2), 1) >= 0) {
icon("fas fa-caret-up")
} else {
icon("fas fa-caret-down")
},
header = paste0(tail(series$EmpregoGES$value, 1), " unidades", " (", tail(months(series$EmpregoGES$date), 1), ")"),
text = "Emprego Formal ES",
rightBorder = FALSE,
marginBottom = FALSE
)
)
)
),
# Selic
box(
title = tags$div("Juros", class = "box-tit"),
closable = FALSE,
width = 4,
height = 700,
status = "warning",
solidHeader = TRUE,
tags$div("Taxa básica Selic", class = "box-subtit"),
tags$div("Taxa ao ano, diária, anualizada, base 252", class = "box-body"),
withSpinner(plotlyOutput(ns("plot1")), type = 1, color = "#004b8d", size = 1.5),
tags$div("Fonte: Banco Central do Brasil", class = "box-legenda"),
tags$div(
HTML(
ifelse(
is.na(tail(legenda_conjuntura$selic, 1)),
"",
tail(legenda_conjuntura$selic, 1)
)
),
style = "box-body"),
footer = fluidRow(
column(
width = 12,
descriptionBlock(
number = paste(round(
tail(series$Selic$value, 1) - head(tail(series$Selic$value, 2), 1), 2
), "%"),
numberColor = if (tail(series$Selic$value, 1) - head(tail(series$Selic$value, 2), 1) >= 0) {
"danger"
} else {
"success"
},
numberIcon = if (tail(series$Selic$value, 1) - head(tail(series$Selic$value, 2), 1) >= 0) {
icon("fas fa-caret-up")
} else {
icon("fas fa-caret-down")
},
header = paste0(tail(series$Selic$value, 1), "%", " (", tail(months(series$Selic$date), 1), ")"),
text = "Selic",
rightBorder = FALSE,
marginBottom = FALSE
)
)
)
),
# Dolar
box(
title = tags$div("Taxa de Câmbio", class = "box-tit"),
closable = FALSE,
width = 12,
# height = 700,
status = "warning",
solidHeader = TRUE,
tags$div("Dólar", class = "box-subtit"),
tags$div("Preço de compra, cotação diária", class = "box-body"),
withSpinner(plotlyOutput(ns("plot2")), type = 1, color = "#004b8d", size = 1.5),
tags$div("Fonte: Banco Central do Brasil", class = "box-legenda"),
tags$div(
HTML(
ifelse(
is.na(tail(legenda_conjuntura$dolar, 1)),
"",
tail(legenda_conjuntura$dolar, 1)
)
),
class = "box-body"
),
footer = fluidRow(
column(
width = 12,
descriptionBlock(
number = paste("R$", round(
tail(series$Dolar$value, 1) - head(tail(series$Dolar$value, 2), 1), 2
), "/US$"),
numberColor = if (tail(series$Dolar$value, 1) - head(tail(series$Dolar$value, 2), 1) >= 0) {
"danger"
} else {
"success"
},
numberIcon = if (tail(series$Dolar$value, 1) - head(tail(series$Dolar$value, 2), 1) >= 0) {
icon("fas fa-caret-up")
} else {
icon("fas fa-caret-down")
},
header = paste0(" R$", round(tail(series$Dolar$value, 1), 2), " /US$", " (", tail(months(series$Dolar$date), 1), ")"),
text = "Dolar",
rightBorder = FALSE,
marginBottom = FALSE
)
)
)
)
)
)
)
}
#' mercados Server Function
#'
#' @noRd
mod_conj_mercados_server <- function(input, output, session) {
ns <- session$ns
# Selic
output$plot1 = renderPlotly({
plot_ly(data = series$Selic, x = ~date, y = ~value,
type = "scatter", mode = "lines", name = "Selic", line = list(color = "#004B8D")) %>%
layout(title = "", xaxis = list(title = ""), yaxis = list(title = "% a.a."),
legend = list(orientation = "h",
x = 0.5,
xanchor = "center")
)
})
# Dolar
output$plot2 = renderPlotly({
plot_ly(data = subset(series$Dolar, date > "2000-01-01"), x = ~date, y = ~value,
type = "scatter", mode = "lines", name = "Dolar", line = list(color = "#004B8D")) %>%
layout(title = "", xaxis = list(title = ""), yaxis = list(title = "R$/US$"),
legend = list(orientation = "h",
x = 0.5,
xanchor = "center")
)
})
# Mercado de Trabalho
output$plot3 = renderPlotly({
plot_ly(data = series$Desemprego, x = ~date, y = ~value,
type = "scatter", mode = "lines", name = "Desemprego", line = list(color = "#004B8D")) %>%
layout(title = "", xaxis = list(title = ""), yaxis = list(title = "%"),
legend = list(orientation = "h",
x = 0.5,
xanchor = "center")
)
})
# Mercado de Trabalho ES
output$plot4 = renderPlotly({
plot_ly(data = series$EmpregoGES, x = ~date, y = ~value,
type = "scatter", mode = "lines", name = "Emprego Gerado", line = list(color = "#004B8D")) %>%
layout(title = "", xaxis = list(title = ""), yaxis = list(title = "unidades"),
legend = list(orientation = "h",
x = 0.5,
xanchor = "center")
)
})
}
## To be copied in the UI
# mod_mercados_ui("mercados_ui_1")
## To be copied in the server
# callModule(mod_mercados_server, "mercados_ui_1")
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.