CRAN Package Check Results for Package ggheatmap

Last updated on 2022-09-11 12:56:18 CEST.

Flavor Version Tinstall Tcheck Ttotal Status Flags
r-devel-linux-x86_64-debian-clang 2.1 8.35 66.28 74.63 ERROR
r-devel-linux-x86_64-debian-gcc 2.1 6.35 49.23 55.58 ERROR
r-devel-linux-x86_64-fedora-clang 2.1 104.97 ERROR
r-devel-linux-x86_64-fedora-gcc 2.2 95.30 OK
r-devel-windows-x86_64 2.1 18.00 88.00 106.00 ERROR
r-patched-linux-x86_64 2.1 13.81 60.64 74.45 ERROR
r-release-linux-x86_64 2.1 8.27 61.28 69.55 ERROR
r-release-macos-arm64 2.1 30.00 OK
r-release-macos-x86_64 2.1 48.00 OK
r-release-windows-x86_64 2.2 14.00 84.00 98.00 OK
r-oldrel-macos-arm64 2.1 33.00 OK
r-oldrel-macos-x86_64 2.1 41.00 OK
r-oldrel-windows-ix86+x86_64 2.1 20.00 87.00 107.00 OK

Check Details

Version: 2.1
Check: examples
Result: ERROR
    Running examples in 'ggheatmap-Ex.R' failed
    The error most likely occurred in:
    
    > base::assign(".ptime", proc.time(), pos = "CheckExEnv")
    > ### Name: ggheatmap
    > ### Title: ggplot2 Version of Heatmap
    > ### Aliases: ggheatmap
    >
    > ### ** Examples
    >
    > #Create data
    > library(ggheatmap)
    > library(tidyr)
    > library(aplot)
    > set.seed(123)
    > df <- matrix(runif(600,0,10),ncol = 12)
    > colnames(df) <- paste("sample",1:12,sep = "")
    > rownames(df) <- sapply(1:50, function(x)paste(sample(LETTERS,3,replace = FALSE),collapse = ""))
    > head(df)
     sample1 sample2 sample3 sample4 sample5 sample6 sample7 sample8
    PIK 2.875775 0.4583117 5.999890 8.474532 2.387260 2.572167 7.84575267 1.365402
    KSJ 7.883051 4.4220007 3.328235 4.975273 9.623589 2.217879 0.09429905 9.674695
    WBF 4.089769 7.9892485 4.886130 3.879090 6.013657 5.930457 7.79065883 5.150718
    TNY 8.830174 1.2189926 9.544738 2.464490 5.150297 2.675214 7.29390652 1.630703
    FRB 9.404673 5.6094798 4.829024 1.110965 4.025733 5.310704 6.30131853 6.219023
    XHK 0.455565 2.0653139 8.903502 3.899944 8.802465 7.852917 4.80910830 9.859542
     sample9 sample10 sample11 sample12
    PIK 9.860543 5.238226 3.5360608 3.275974
    KSJ 1.370675 3.498018 3.6644144 2.049387
    WBF 9.053096 2.405307 2.8710013 5.693827
    TNY 5.763018 0.581918 0.7997291 8.880552
    FRB 3.954489 2.366197 3.6545427 5.297141
    XHK 4.498025 8.900779 1.7801381 5.869587
    > #example 1
    > text_rows <- sample(rownames(df),3)
    > p <- ggheatmap(df,scale = "row",cluster_rows = TRUE,cluster_cols = TRUE,
    + text_show_rows = text_rows)%>%
    + ggheatmap_theme(1,theme =list(
    + theme(axis.text.x = element_text(angle = 90,face = "bold"),
    + axis.text.y = element_text(colour = "red",face = "bold"))
    + ))
    Warning: `guides(<scale> = FALSE)` is deprecated. Please use `guides(<scale> = "none")` instead.
    Warning: `guides(<scale> = FALSE)` is deprecated. Please use `guides(<scale> = "none")` instead.
    Warning in ggheatmap_theme(., 1, theme = list(theme(axis.text.x = element_text(angle = 90, :
     Incompatible methods ("Ops.data.frame", "+.gg") for "+"
    Error in ggheatmap[[1]][[num]] + theme[[i]] :
     non-numeric argument to binary operator
    Calls: %>% -> ggheatmap_theme
    Execution halted
Flavors: r-devel-linux-x86_64-debian-clang, r-devel-linux-x86_64-debian-gcc, r-patched-linux-x86_64, r-release-linux-x86_64

Version: 2.1
Check: examples
Result: ERROR
    Running examples in ‘ggheatmap-Ex.R’ failed
    The error most likely occurred in:
    
    > ### Name: ggheatmap
    > ### Title: ggplot2 Version of Heatmap
    > ### Aliases: ggheatmap
    >
    > ### ** Examples
    >
    > #Create data
    > library(ggheatmap)
    > library(tidyr)
    > library(aplot)
    > set.seed(123)
    > df <- matrix(runif(600,0,10),ncol = 12)
    > colnames(df) <- paste("sample",1:12,sep = "")
    > rownames(df) <- sapply(1:50, function(x)paste(sample(LETTERS,3,replace = FALSE),collapse = ""))
    > head(df)
     sample1 sample2 sample3 sample4 sample5 sample6 sample7 sample8
    PIK 2.875775 0.4583117 5.999890 8.474532 2.387260 2.572167 7.84575267 1.365402
    KSJ 7.883051 4.4220007 3.328235 4.975273 9.623589 2.217879 0.09429905 9.674695
    WBF 4.089769 7.9892485 4.886130 3.879090 6.013657 5.930457 7.79065883 5.150718
    TNY 8.830174 1.2189926 9.544738 2.464490 5.150297 2.675214 7.29390652 1.630703
    FRB 9.404673 5.6094798 4.829024 1.110965 4.025733 5.310704 6.30131853 6.219023
    XHK 0.455565 2.0653139 8.903502 3.899944 8.802465 7.852917 4.80910830 9.859542
     sample9 sample10 sample11 sample12
    PIK 9.860543 5.238226 3.5360608 3.275974
    KSJ 1.370675 3.498018 3.6644144 2.049387
    WBF 9.053096 2.405307 2.8710013 5.693827
    TNY 5.763018 0.581918 0.7997291 8.880552
    FRB 3.954489 2.366197 3.6545427 5.297141
    XHK 4.498025 8.900779 1.7801381 5.869587
    > #example 1
    > text_rows <- sample(rownames(df),3)
    > p <- ggheatmap(df,scale = "row",cluster_rows = TRUE,cluster_cols = TRUE,
    + text_show_rows = text_rows)%>%
    + ggheatmap_theme(1,theme =list(
    + theme(axis.text.x = element_text(angle = 90,face = "bold"),
    + axis.text.y = element_text(colour = "red",face = "bold"))
    + ))
    Warning: `guides(<scale> = FALSE)` is deprecated. Please use `guides(<scale> = "none")` instead.
    Warning: `guides(<scale> = FALSE)` is deprecated. Please use `guides(<scale> = "none")` instead.
    Warning in ggheatmap_theme(., 1, theme = list(theme(axis.text.x = element_text(angle = 90, :
     Incompatible methods ("Ops.data.frame", "+.gg") for "+"
    Error in ggheatmap[[1]][[num]] + theme[[i]] :
     non-numeric argument to binary operator
    Calls: %>% -> ggheatmap_theme
    Execution halted
Flavors: r-devel-linux-x86_64-fedora-clang, r-devel-windows-x86_64