Be concise.
Be useful.
All contributions dictatorially edited by webmasters to match personal tastes.
Please do not paste any copyright violating material.
Please try to avoid dependencies to third-party libraries and frameworks.
IDENTIFICATION DIVISION.
PROGRAM-ID. blank string.
DATA DIVISION.
WORKING-STORAGE SECTION.
01 BOOLEAN-BLANK PIC X.
88 BLANK VALUE "T".
88 NOT-BLANK VALUE "F".
PROCEDURE DIVISION.
IF s > SPACES
SET BLANK TO TRUE
ELSE
SET NOT-BLANK TO TRUE
END-IF
STOP RUN.
bool blank = string.IsNullOrWhiteSpace(s);
bool blank = string.IsNullOrWhiteSpace(s);
final blank = s == null || s.trim() == '';
bool blank = s?.trim()?.isEmpty ?? true;
blank = s == nil || String.length(String.trim s) == 0
Blank = string:is_empty(string:trim(S)).
blank = s == ''
const blank = s == null || s.trim() === ''
boolean blank = s==null || s.isBlank();
boolean blank = s==null || s.strip().isEmpty();
boolean blank = s == null || s.isBlank();
val blank = s.isNullOrBlank()
(setf blank (not (find #\space s :test-not #'eql)))
blank = (s == nil or #string.gsub(s, "^%s*(.-)%s*$", "%1") == 0)
$blank = (empty(trim($s));
$blank = !trim($s);
blank := trim(s) = '';
$blank = !$s || $s=~/^\s*$/;
blank = not s or s.isspace()
blank = s.nil? or s.strip.empty?
let blank = s.chars().all(|c| c.is_whitespace());
let blank = s.trim().is_empty();
val blank = Option(s).forall(_.trim.isEmpty)
(define (empty-string? s)
(= (string-length s) 0))
(define blank (empty-string? (string-trim s)))
blank := s isAllSeparators.
Dim blank As Boolean = String.IsNullOrWhitespace(s)