Giter Site home page Giter Site logo

dsbox's Introduction

tidyverse

CRAN status R-CMD-check Codecov test coverage

Overview

The tidyverse is a set of packages that work in harmony because they share common data representations and API design. The tidyverse package is designed to make it easy to install and load core packages from the tidyverse in a single command.

If you’d like to learn how to use the tidyverse effectively, the best place to start is R for Data Science (2e).

Installation

# Install from CRAN
install.packages("tidyverse")
# Install the development version from GitHub
# install.packages("pak")
pak::pak("tidyverse/tidyverse")

If you’re compiling from source, you can run pak::pkg_system_requirements("tidyverse"), to see the complete set of system packages needed on your machine.

Usage

library(tidyverse) will load the core tidyverse packages:

You also get a condensed summary of conflicts with other packages you have loaded:

library(tidyverse)
#> ── Attaching core tidyverse packages ─────────────────── tidyverse 2.0.0.9000 ──
#> ✔ dplyr     1.1.3     ✔ readr     2.1.4
#> ✔ forcats   1.0.0     ✔ stringr   1.5.0
#> ✔ ggplot2   3.4.4     ✔ tibble    3.2.1
#> ✔ lubridate 1.9.3     ✔ tidyr     1.3.0
#> ✔ purrr     1.0.2     
#> ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
#> ✖ dplyr::filter() masks stats::filter()
#> ✖ dplyr::lag()    masks stats::lag()
#> ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors

You can see conflicts created later with tidyverse_conflicts():

library(MASS)
#> 
#> Attaching package: 'MASS'
#> The following object is masked from 'package:dplyr':
#> 
#>     select
tidyverse_conflicts()
#> ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
#> ✖ dplyr::filter() masks stats::filter()
#> ✖ dplyr::lag()    masks stats::lag()
#> ✖ MASS::select()  masks dplyr::select()
#> ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors

And you can check that all tidyverse packages are up-to-date with tidyverse_update():

tidyverse_update()
#> The following packages are out of date:
#>  * broom (0.4.0 -> 0.4.1)
#>  * DBI   (0.4.1 -> 0.5)
#>  * Rcpp  (0.12.6 -> 0.12.7)
#>  
#> Start a clean R session then run:
#> install.packages(c("broom", "DBI", "Rcpp"))

Packages

As well as the core tidyverse, installing this package also installs a selection of other packages that you’re likely to use frequently, but probably not in every analysis. This includes packages for:

  • Working with specific types of vectors:

    • hms, for times.
  • Importing other types of data:

    • feather, for sharing with Python and other languages.
    • haven, for SPSS, SAS and Stata files.
    • httr, for web apis.
    • jsonlite for JSON.
    • readxl, for .xls and .xlsx files.
    • rvest, for web scraping.
    • xml2, for XML.
  • Modelling

    • modelr, for modelling within a pipeline
    • broom, for turning models into tidy data

Code of Conduct

Please note that the tidyverse project is released with a Contributor Code of Conduct. By contributing to this project, you agree to abide by its terms.

dsbox's People

Contributors

debbieyuster avatar evandragich avatar jmclawson avatar lee-suddaby avatar mine-cetinkaya-rundel avatar natashadunstan avatar

Stargazers

 avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar

Watchers

 avatar  avatar  avatar  avatar  avatar  avatar  avatar

dsbox's Issues

Package ‘dsbox’ is not available for latest R version

Hi team,
The package ‘dsbox’ was not available for my R version so I updated it to version 4.2.3 however, the same issue persists.
Version Details of my setup:
R version: 4.2.3
MacOS: 12.6.2 (21G320)
RStudio 2021.09.0+351 "Ghost Orchid" Release (077589bcad3467ae79f318afe8641a1899a51606, 2021-09-20) for macOS
Mozilla/5.0 (Macintosh; Intel Mac OS X 12_6_2) AppleWebKit/537.36 (KHTML, like Gecko) QtWebEngine/5.12.10 Chrome/69.0.3497.128 Safari/537.36

Could you please assist on the version requirements to resolve this?

problema en la instalación de penguinsbox

Installing package into ‘C:/Users/carabali/Documents/R/win-library/4.0’
(as ‘lib’ is unspecified)

  • installing source package 'penguinsbox' ...
    ** using staged installation
    ** inst
    ** help
    No man pages found in package 'penguinsbox'
    *** installing help indices
    converting help for package 'penguinsbox'
    finding HTML links ... done
    *** copying figures
    ** building package indices
    ** testing if installed package can be loaded from temporary location
    Error: package or namespace load failed for 'penguinsbox' in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]):
    namespace 'ellipsis' 0.3.1 is already loaded, but >= 0.3.2 is required
    Error: loading failed
    Execution halted
    ERROR: loading failed
  • removing 'C:/Users/carabali/Documents/R/win-library/4.0/penguinsbox'

Move `master` branch to `main`

Cc @mine-cetinkaya-rundel

The master branch of this repository will soon be renamed to main, as part of a coordinated change across several GitHub organizations (including, but not limited to: tidyverse, r-lib, tidymodels, and sol-eng). We anticipate this will happen by the end of September 2021.

That will be preceded by a release of the usethis package, which will gain some functionality around detecting and adapting to a renamed default branch. There will also be a blog post at the time of this master --> main change.

The purpose of this issue is to:

  • Help us firm up the list of targetted repositories
  • Make sure all maintainers are aware of what's coming
  • Give us an issue to close when the job is done
  • Give us a place to put advice for collaborators re: how to adapt

message id: entire_lizard

Unable to install tutorial "demar01/penguinsbox"

Hi,

Sorry to be troublesome, but I have been working to get my computer to install the tutorial for useR! conference. I have Linux Mint 19.3 / Ubuntu 18.04 and was able to upgrade R to latest version, and install all package dependencies (remotes, devtools, learnr), but when I try to use remotes package to install "demar01/penguinsbox" or "rstudio/parsons" I keep getting the following error:

remotes::install_github("demar01/penguinsbox") Error: Failed to install 'unknown package' from GitHub: Timeout was reached: [api.github.com] Resolving timed out after 10000 milliseconds

 
Please advise if possible!

Many thanks :)

Kylie

"Error occurred while checking the submission" is common

Often in the code-chunk exercises, after clicking Run Code and then Submit Answer, the "Error occurred while checking the submission" message results. As an example, see attached screenshot from 07-exploregss. When I run it locally, I get the same error, and the RMarkdown pane shows the following warnings:

Warning in selectChildren(jobs, timeout) :
cannot wait for child 726 as it does not exist
Loading required namespace: testthat
Error in .f(.x[[i]], ...): Assertion on '.user' failed: Must be of type 'atomic', not 'expression'.
Error in .f(.x[[i]], ...): Assertion on '.message' failed: Must be of type 'atomic', not 'expression'.
Error in .f(.x[[i]], ...): Assertion on '.incorrect' failed: Must be of type 'atomic', not 'expression'.

Warning in selectChildren(jobs, timeout) :
cannot wait for child 734 as it does not exist

I assume the problem is with this line: exercise.error.check.code = gradethis::grade_learnr_error
and whatever is going on under the hood? Just wondering if you think it's fixable in the near term or if it will need to wait for substantive updates to gradethis.

Note that the errors don't occur if one copy/pastes the solution code given in the hints.
learnr_error

Exercise set ups in dcbikeshare

There appear to be many exercise set up code chunks at the beginning of the dcbikeshare tutorial. However, none of them are referenced in the actual exercise code chunks using `exercise.setup=label". Is this an error or am I missing something?

Recommend Projects

  • React photo React

    A declarative, efficient, and flexible JavaScript library for building user interfaces.

  • Vue.js photo Vue.js

    🖖 Vue.js is a progressive, incrementally-adoptable JavaScript framework for building UI on the web.

  • Typescript photo Typescript

    TypeScript is a superset of JavaScript that compiles to clean JavaScript output.

  • TensorFlow photo TensorFlow

    An Open Source Machine Learning Framework for Everyone

  • Django photo Django

    The Web framework for perfectionists with deadlines.

  • D3 photo D3

    Bring data to life with SVG, Canvas and HTML. 📊📈🎉

Recommend Topics

  • javascript

    JavaScript (JS) is a lightweight interpreted programming language with first-class functions.

  • web

    Some thing interesting about web. New door for the world.

  • server

    A server is a program made to process requests and deliver data to clients.

  • Machine learning

    Machine learning is a way of modeling and interpreting data that allows a piece of software to respond intelligently.

  • Game

    Some thing interesting about game, make everyone happy.

Recommend Org

  • Facebook photo Facebook

    We are working to build community through open source technology. NB: members must have two-factor auth.

  • Microsoft photo Microsoft

    Open source projects and samples from Microsoft.

  • Google photo Google

    Google ❤️ Open Source for everyone.

  • D3 photo D3

    Data-Driven Documents codes.