Skip to content

Commit

Permalink
Fix padding issue with switched facet strips
Browse files Browse the repository at this point in the history
Closes #1170
  • Loading branch information
lionel- committed Jul 27, 2015
1 parent f8b893b commit ebc8a1c
Showing 1 changed file with 1 addition and 1 deletion.
2 changes: 1 addition & 1 deletion R/facet-grid-.r
Expand Up @@ -323,8 +323,8 @@ facet_render.grid <- function(facet, panel, coord, theme, geom_grobs) {
complete <- rbind(center, bottom, z = c(1, 2))
} else if (switch_y) {
top <- strips$t
top <- gtable_add_cols(top, gt_r$widths, pos = 0)
top <- gtable_add_cols(top, axes$l$widths, pos = 0)
top <- gtable_add_cols(top, gt_r$widths, pos = 0)

center <- cbind(gt_r, axes$l, panels, z = c(3, 2, 1))
bottom <- axes$b
Expand Down

0 comments on commit ebc8a1c

Please sign in to comment.