GithubHelp home page GithubHelp logo

owi-blog's People

Contributors

dblodgett-usgs avatar fawda123 avatar jfisher-usgs avatar jiwalker-usgs avatar jkreft-usgs avatar ldecicco-usgs avatar limnoliver avatar mwernimont avatar srlewein-usgs avatar wdwatkins avatar

Stargazers

 avatar  avatar  avatar

Watchers

 avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar  avatar

owi-blog's Issues

Alerts?

" I hope there is a way so that someone could just look for the blog posts that relate to EGRET and also those that related to dataRetrieval. My guess is that there will be a lot of posts happening and I'd like it for people who are primarily interested in EGRET and/or dataRetrieval to get to the ones they want to see. Do you think there will also be a mechanism for someone to have an alert set so that when a new EGRET-related blog post goes up it generates an automatic e-mail telling them about the new post and linking to it? That would be super if it can be done."

Anyone have any idea how this could be done?

OWI Favicon

Also, the OWI image in the upper-left header should probably direct to owi.usgs.gov

Smart default images

Seems like it would be do-able to put some logic into the config file that if a blog-post is tagged with R (or category is R?)...then the default image could be a different image than if it was tagged as OWI or Water Quality Portal...or something.

Revisit code style

The code style I think could still use some sprucing up.

Take the code from the plotFlowConc post:

library(EGRET)
library(ggplot2)

eList <-  Choptank_eList
Sample <- eList$Sample
INFO <- eList$INFO

Sample$cen <- factor(Sample$Uncen)
levels(Sample$cen) <- c("Censored","Uncensored") 

plotConcQ_gg <- ggplot(data=Sample) +
  geom_point(aes(x=Q, y=ConcAve, color = cen)) +
  scale_x_log10() +
  ggtitle(INFO$station.nm)

plotConcQ_gg
plotConcQ(eList)

Mirroring the above github style would be my first vote. At a minimum, I think we need to improve the contrast.

Individual emails or other accounts (twitter)

It would be nice (or, a must?) to include emails, links (like to your professional page), and/or twitter handles for individual authors.

@lindsaycarr or @wdwatkins with the help of @mwernimont :

https://discuss.gohugo.io/t/how-to-access-site-params-map-with-a-params-variable/348/2

And see if we can create something like this for our individual authors. Particularly with:

blog/plotFlowConc/

One of the authors is not USGS (EPA), it would be great to flush out a way to do a combo post.

Category vs Tags

Someone that understands this a bit better...could you have a look at the in-development blog, and see what we should be doing?

Missing Google analytics

Need the group specific and USGS google analytics snippets

<script>
  (function(i,s,o,g,r,a,m){i['GoogleAnalyticsObject']=r;i[r]=i[r]||function(){
  (i[r].q=i[r].q||[]).push(arguments)},i[r].l=1*new Date();a=s.createElement(o),
  m=s.getElementsByTagName(o)[0];a.async=1;a.src=g;m.parentNode.insertBefore(a,m)
  })(window,document,'script','//www.google-analytics.com/analytics.js','ga');
  ga('create', 'UA-76112553-1', 'usgs.gov');
  ga('send', 'pageview');

</script>



<script type="application/javascript" src="https://www2.usgs.gov/scripts/analytics/usgs-analytics.js"></script>

More style

Below the posts are twitter and other icons. We need to figure out how to configure that stuff. Generally, we might want to pick a different theme. I'm not a huge fan of how the code is being styled. I'll try to get more specific the more I play.

Image sizes

The default seems to be (at least) 100% width. I'd prefer to keep the native size of the images...or at least muck around with something even smarter.

Shorten grid

The "notecards" on the main page (that show all the blog posts) are too tall. There's a section below the authors that doesn't seem to be used. Can we get rid of that?

README

Populate README with instructions on how to get Hugo installed and how to make a blog post

Existing blogs need alt tags + update creator/reviewer instructions

idea from @jkreft-usgs

  • hey, something that you are going to dinged on from an accessabilty standpoint is alt-tags for images
Images
![alt text][id]

Mobile title word wrapping

@jread-usgs can paste in the issue, but it's the same funkyness we saw early in the blog life. Just on the title, and just in mobile.

@mwernimont think you can track down the problem? (he also pasted a screenshot in slack).

More categories?

I'm working on a blog post about the NLDI. Wondering if we should add a "data services" category or something along those lines? The latest National Map Layers blog post might fit in the same one?

Header / Footer should match owi

We need to match the style/flow of the main owi.usgs.gov page. I think more specifically, we should also have the banner that is the individual
banner
sections:

All posts on one page for home screen?

I think its a bit odd having the listing of posts split between two pages, and would look better all on one that you can scroll through. This might be a personal opinion though.

Push to dev

@jiwalker-usgs while you are working on making an automated way to push up the viz lab stuff to the "dev" tier, can you work on this too?

I would think generally it's more more simple.

Title/author relative font sizes

Title and author font is currently the same size, which makes the author a bit too prominent. Make the title bigger, author smaller or both. Maybe have author same size as the date?

Blog things

  • Put the technical details toward the bottom, so that non techies don't have to read about Hugo
  • Applications: OWI runs about 40 different applications, from the enterprise scale data accession, management, and distribution applications that comprise the National Water Information System that are used by millions of people across the country to boutique data analysis tools that serve a few scientists.

Code style

Just taking off the dark background for code seemed pretty nice. But, I've often said I like github's css for R code. Here's a little sample:

boxResidMonth<-function(eList, stdResid = FALSE, las=1,
                        printTitle = TRUE, cex=0.8, cex.axis=1.1, cex.main=1.1,
                        font.main=2, tinyPlot=FALSE, customPar=FALSE,rResid=FALSE,...) {

  localINFO <- getInfo(eList)
  localSample <- getSample(eList)

  if(sum(c("paStart","paLong") %in% names(localINFO)) == 2){
    paLong <- localINFO$paLong
    paStart <- localINFO$paStart  
  } else {
    paLong <- 12
    paStart <- 10
  } 

  localSample <- if(paLong == 12) localSample else selectDays(localSample, paLong,paStart)

  title2<-if(paLong==12) "" else setSeasonLabelByUser(paStartInput=paStart,paLongInput=paLong)

  if (tinyPlot){
    if (!customPar) par(mar=c(4,5,1,0.1),cex.lab=cex.axis,mgp=c(2.5,0.5,0),tcl=0.5)
    yLab<-if(stdResid) "Standardized Residuals" else "Residuals"
    names <- c("J","F","M","A","M","J","J","A","S","O","N","D")
  } else {
    if (!customPar) par(mar=c(5,6,4,2) + 0.1,cex.lab=cex.axis,mgp=c(3,1,0),tcl=0.5)
    yLab<-if(stdResid) "Standardized Residuals in natural log units" else "Residuals in natural log units"    
    names <- sapply(c(1:12),function(x){monthInfo[[x]]@monthAbbrev})
  }

  plotTitle<-if(printTitle) paste(localINFO$shortName,"\n",localINFO$paramShortName,"\nBoxplots of residuals by month") else ""

  if(!rResid){
    resid<-log(localSample$ConcAve) - localSample$yHat
  } else {
    if(!("rResid" %in% names(localSample))){
      eList <- makeAugmentedSample(eList)
      localSample <- eList$Sample
    }
    resid <- localSample$rResid
  }

  if(stdResid) {
    resid<- resid/localSample$SE
  }

  singleMonthList <- sapply(c(1:12),function(x){monthInfo[[x]]@monthAbbrev})

  namesListFactor <- factor(singleMonthList, levels=singleMonthList)
  monthList <- as.character(apply(localSample, 1, function(x)  monthInfo[[as.numeric(x[["Month"]])]]@monthAbbrev))
  monthList <- factor(monthList, namesListFactor)

  boxplot(resid ~ monthList,
          varwidth=TRUE,
          xlab="Month",ylab=yLab,
          main=plotTitle,
          names=names,
          cex=cex,
          cex.main=cex.main,
          cex.axis=cex.axis,
          las=las,
          ...)
  abline(h=0)  
  if (!tinyPlot) mtext(title2,side=3,line=-1.5)
  invisible(eList)
}

Link update

Re.

USGS Water Data for the Nation | http://nwis.waterdata.usgs.gov/

Please change nwis.waterdata to waterdata. The less nwis.waterdata is advertised, the better. Waterdata will take care of any redirects necessary and is much more robust and redundant.

less funky word wrapping

the current dev prototype has words being broken into unconventional pieces, with no hyphens, when they occur at/across a line break. e.g.,

the point of this dem
o is to show how wor
ds are breaking oddl
y

there's surely some way to prevent this from happening.

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.